ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
fc2k_database_profiles3.f90
Go to the documentation of this file.
1  SUBROUTINE database_profiles3(COREPROF_DB, COREPROF, COREPROF_OUT, RHO_INTERPOL,stretch_and_cut)
2 !dy same as version2 but with stretch_and_cut possibility
3 
5  USE deallocate_structures
6 
7  USE itm_constants
8  USE euitm_routines
9  USE euitm_schemas
10  USE interpolate_cpo
11  USE copy_structures
12  use, INTRINSIC :: ieee_arithmetic
13 
14  IMPLICIT NONE
15 
16 
17 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
18 ! +++ CPOs:
19 
20 
21  TYPE (type_coreprof), POINTER :: coreprof(:)
22  TYPE (type_coreprof), POINTER :: coreprof_out(:)
23  TYPE (type_coreprof), POINTER :: coreprof_db(:)
24 
25  INTEGER, PARAMETER :: nslice = 1 !number of CPO ocurancies in the work flow
26  INTEGER :: nrho1, nrho2
27  INTEGER :: nnucl1
28  INTEGER :: nion1, iion1
29  INTEGER :: nimp1
30  INTEGER, ALLOCATABLE :: nzimp1(:)
31  INTEGER :: nneut1
32  INTEGER, ALLOCATABLE :: ncomp1(:)
33  INTEGER, ALLOCATABLE :: ntype1(:)
34 
35 
36 
37 
38  INTEGER :: interpol !interpolation index
39  INTEGER :: rho_interpol
40  integer :: stretch_and_cut
41 
42  CHARACTER(len=10) :: cpopath
43 ! values for the fix of zero/negative density/temperature
44  REAL (R8), parameter :: temperature_floor = 10.0e0_r8 ! [eV] sets ...
45  REAL (R8), parameter :: density_floor = 1.0e6_r8 ! [m-3] sets ...
46 
47 
48 
49 
50 ! +++ allocate and define grid of output CPO:
51  nrho1 = SIZE(coreprof(1)%rho_tor, dim=1)
52  CALL get_comp_dimensions(coreprof(1)%COMPOSITIONS, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1)
53  CALL allocate_coreprof_cpo(nslice, nrho1, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1, coreprof_out)
54  CALL copy_cpo(coreprof(1), coreprof_out(1))
55  coreprof_out(1)%rho_tor = coreprof(1)%rho_tor
56 
57 
58 
59 !dy add option for stretch_:and _cut
60 if (stretch_and_cut.eq.0) then
61 
62 ! +++ Retrieve CPO from the data base:
63  cpopath = 'COREPROF'
64 
65 
66  if (associated(coreprof_db)) then
67  write(6,*) ' profiles are read from the database'
68  else
69  WRITE (6,*) 'ERROR>>> NO COREPROF CPO IN THE DATABASE FOR SELECTED SHOT:'
70  CALL allocate_coreprof_cpo(nslice, nrho1, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1, coreprof_db)
71  call deallocate_cpo(coreprof_db(1)%COMPOSITIONS)
72  CALL copy_cpo(coreprof(1)%COMPOSITIONS, coreprof_db(1)%COMPOSITIONS)
73  coreprof_db(1)%rho_tor = coreprof(1)%rho_tor
74  endif
75 
76 
77 
78 ! +++ OUTPUT TRANSPORT CPO:
79  nrho2 = SIZE (coreprof_db(1)%rho_tor, dim=1)
80 
81  IF (rho_interpol.NE.0) &
82  coreprof_db(1)%rho_tor = coreprof_db(1)%rho_tor &
83  / coreprof_db(1)%rho_tor(nrho2) &
84  * coreprof_out(1)%rho_tor(nrho1)
85 
86 
87 
88 ! +++ Interpolate CPO:
89  CALL interpolate_prof(coreprof_db(1), coreprof(1))
90 
91 end if !stretch_and_cut
92 !dy
93 
94 
95 ! +++ Copy profiles:
96  IF (coreprof_out(1)%psi%flag .EQ. 1) &
97  coreprof_out(1)%psi%value = coreprof(1)%psi%value
98  IF (coreprof_out(1)%ne%flag .EQ. 1) &
99  coreprof_out(1)%ne%value = coreprof(1)%ne%value
100  IF (coreprof_out(1)%te%flag .EQ. 1) &
101  coreprof_out(1)%te%value = coreprof(1)%te%value
102 
103 
104 ! find and fix potential problems in profiles data (later move this to a general
105 ! subroutine)
106  where(coreprof_out(1)%te%value.lt.temperature_floor .or. ieee_is_nan(coreprof_out(1)%te%value)) &
107  coreprof_out(1)%te%value = temperature_floor
108  where(coreprof_out(1)%ne%value.lt.density_floor .or. ieee_is_nan(coreprof_out(1)%ne%value)) &
109  coreprof_out(1)%ne%value = density_floor
110 
111  DO iion1 = 1, nion1
112 
113  IF (coreprof_out(1)%ni%flag(iion1) .EQ. 1) &
114  coreprof_out(1)%ni%value(:,iion1) = coreprof(1)%ni%value(:,iion1)
115  IF (coreprof_out(1)%ti%flag(iion1) .EQ. 1) &
116  coreprof_out(1)%ti%value(:,iion1) = coreprof(1)%ti%value(:,iion1)
117  IF (coreprof_out(1)%vtor%flag(iion1) .EQ. 1) &
118  coreprof_out(1)%vtor%value(:,iion1) = coreprof(1)%vtor%value(:,iion1)
119 
120  where(coreprof_out(1)%ti%value(:, iion1).lt.temperature_floor .or. ieee_is_nan(coreprof_out(1)%ti%value(:,iion1))) &
121  coreprof_out(1)%ti%value(:, iion1) = temperature_floor
122  where(coreprof_out(1)%ni%value(:, iion1).lt.density_floor .or. ieee_is_nan(coreprof_out(1)%ni%value(:,iion1))) &
123  coreprof_out(1)%ni%value(:, iion1) = density_floor
124 
125  END DO
126 
127  IF (coreprof_out(1)%ne%flag .EQ. 3) THEN
128  coreprof_out(1)%ne%boundary%value(1) = coreprof(1)%ne%value(nrho1)
129  coreprof_out(1)%ne%boundary%value(2) = 0.0_r8
130  coreprof_out(1)%ne%boundary%value(3) = 0.0_r8
131  coreprof_out(1)%ne%boundary%type = 1
132  END IF
133  IF (coreprof_out(1)%te%flag .EQ. 3) THEN
134  coreprof_out(1)%te%boundary%value(1) = coreprof(1)%te%value(nrho1)
135  coreprof_out(1)%te%boundary%value(2) = 0.0_r8
136  coreprof_out(1)%te%boundary%value(3) = 0.0_r8
137  coreprof_out(1)%te%boundary%type = 1
138  END IF
139 
140  DO iion1 = 1, nion1
141 
142  IF (coreprof_out(1)%ni%flag(iion1) .EQ. 3) THEN
143  coreprof_out(1)%ni%boundary%value(1,iion1) = coreprof(1)%ni%value(nrho1,iion1)
144  coreprof_out(1)%ni%boundary%value(2,iion1) = 0.0_r8
145  coreprof_out(1)%ni%boundary%value(3,iion1) = 0.0_r8
146  coreprof_out(1)%ni%boundary%type(iion1) = 1
147 
148  END IF
149  IF (coreprof_out(1)%ti%flag(iion1) .EQ. 3) THEN
150  coreprof_out(1)%ti%boundary%value(1,iion1) = coreprof(1)%ti%value(nrho1,iion1)
151  coreprof_out(1)%ti%boundary%value(2,iion1) = 0.0_r8
152  coreprof_out(1)%ti%boundary%value(3,iion1) = 0.0_r8
153  coreprof_out(1)%ti%boundary%type(iion1) = 1
154 
155  END IF
156  IF (coreprof_out(1)%vtor%flag(iion1) .EQ. 3) THEN
157  coreprof_out(1)%vtor%boundary%value(1,iion1) = coreprof(1)%vtor%value(nrho1,iion1)
158  coreprof_out(1)%vtor%boundary%value(2,iion1) = 0.0_r8
159  coreprof_out(1)%vtor%boundary%value(3,iion1) = 0.0_r8
160  coreprof_out(1)%vtor%boundary%type(iion1) = 1
161 
162  END IF
163 
164  END DO
165 
166 !dy always get the rotation if it is is given on input
167  IF (ASSOCIATED(coreprof(1)%profiles1d%wtor%value)) then
168  do iion1=1,nion1
169  coreprof_out(1)%profiles1d%wtor%value(:,iion1)=coreprof(1)%profiles1d%wtor%value(:,iion1)
170  enddo
171  end if
172 
173 !dy
174 
175  if (associated(coreprof_db)) CALL deallocate_cpo(coreprof_db)
176  IF (ALLOCATED(nzimp1)) DEALLOCATE (nzimp1)
177  IF (ALLOCATED(ncomp1)) DEALLOCATE (ncomp1)
178  IF (ALLOCATED(ntype1)) DEALLOCATE (ntype1)
179 
180 
181 
182 
183  RETURN
184 
185 
186  END SUBROUTINE database_profiles3
187 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
188 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
189 
190 
191 
192 
193 
194 
subroutine database_profiles3(COREPROF_DB, COREPROF, COREPROF_OUT, RHO_INTERPOL, stretch_and_cut)
subroutine allocate_coreprof_cpo(NSLICE, NRHO, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP, COREPROF)
This routine allocates COREPROF CPO.
subroutine get_comp_dimensions(COMPOSITIONS, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP)
subroutine interpolate_prof(COREPROF_IN, COREPROF_OUT)
This module contains routines for allocation/deallocation if CPOs used in ETS.