ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
synchrotron_cytran.f90
Go to the documentation of this file.
1  SUBROUTINE synchrotron_cytran(EQUILIBRIUM, COREPROF, CORESOURCE, CODEPARAMS)
2 
3 !---------------------------------------------------------------------------------------
4 ! This routine calculate sybchrotron radiation
5 !
6 ! Source: NTCC Library
7 ! Developers: W. Houlberg, P. Strand
8 ! Contacts: par.strand@chalmers.se
9 !----------------------------------------------------------------------------------------
10 
11  USE itm_types
12  USE itm_constants
13  USE euitm_schemas
14  USE copy_structures
16  USE cytran_mod
17 
18 !PIS USE l3interps
19 
20  IMPLICIT NONE
21 
22 ! CPO derived types:
23  TYPE (type_equilibrium), POINTER :: equilibrium(:)! input CPO equilibrium
24  TYPE (type_coreprof), POINTER :: coreprof(:) ! input CPO main plasma
25  TYPE (type_coresource), POINTER :: coresource(:) ! output CPO with syncrhotron radiation
26  TYPE (type_param) :: codeparams ! CODE PARAMETERS
27 
28 ! local quantities
29 
30 ! Dimensions: CPO related
31  INTEGER :: nrho, & !number of radial points (input, determined from COREPROF CPO)
32  nnucl, & !number of ion species (input, determined from COREPROF CPO)
33  nion, & !number of ion species (input, determined from COREPROF CPO)
34  nimp, & !number of impurity species (input, determined from COREPROF CPO)
35  nneut !number of neutrals species (input, determined from COREPROF CPO)
36 
37  INTEGER, ALLOCATABLE :: ntype(:), & !number of impurity ionization states (input)
38  ncomp(:), & !max_number of distinct atoms enter the composition-"1" wich is neutral
39  nzimp(:)
40 
41  INTEGER, PARAMETER :: nocur = 1 !number of CPO ocurancies in the work flow
42 
43 ! Model parameters
44  REAL(R8),ALLOCATABLE :: psync_ref(:), & ! Synchrotron term original formula [W/m**3]
45  bmod_r(:), & ! <|B|> Magnetic field strengt [T]
46  ne_r(:), & ! electron density [/m**3]
47  te_r(:), & ! electron temperature [keV]
48  dvol_r(:), & ! Incremental volume [m**3]
49  area_rm(:), & ! Surface area [m**2]
50  psync_r(:) ! Cytran estimate [W/m**3]
51 
52  REAL(R8), SAVE :: f_self, & ! x(o) to x(o) mode conversion [-]
53  f_abs ! Wall absorption [-]
54  INTEGER, SAVE :: kmodel, & !Internal model selectr = 0 CYTRAN =1 Original calculation
55  kflip, & ! flip sign of original calculation (originally given as a loss) = 0 no, 1 yes
56  kverbosity ! Output flag
57 
58  REAL(R8) :: ree, roo, roe, reo ! REflection coefficients
59 
60 ! Grids
61  REAL(R8),ALLOCATABLE :: rho_r(:), & ! Radial grid normalized toroidal flux [m]
62  rho_rm(:) ! Surface area grid cell boundaries first point axis and nrho point at boundary
63 ! Temporary placeholder
64  REAL(R8),ALLOCATABLE :: temp(:)
65 
66 ! Counters
67  INTEGER :: i , return_status
68 ! flags
69 
70  logical, save :: initial = .true.
71 
72 ! +++ Set dimensions:
73  nrho = SIZE (coreprof(1)%rho_tor)
74  CALL get_comp_dimensions(coreprof(1)%compositions, nnucl, nion, nimp, nzimp, nneut, ntype, ncomp)
75 
76 ! +++ Allocate output CPOs:
77  CALL allocate_coresource_cpo(nocur, nrho, nnucl, nion, nimp, nzimp, nneut, ntype, ncomp, coresource)
78  CALL copy_cpo(coreprof(1)%compositions, coresource(1)%compositions)
79 
80  coresource(1)%datainfo%cocos = 13
81  coresource(1)%time = coreprof(1)%time
82  coresource(1)%VALUES(1)%rho_tor = coreprof(1)%rho_tor
83  coresource(1)%VALUES(1)%rho_tor_norm = coreprof(1)%rho_tor/coreprof(1)%rho_tor(nrho)
84 
85 ! +++ Set default variables
86 
87  if (initial ) THEN
88  kmodel = 0
89  kflip = 0
90  kverbosity = 1
91  f_self = 0.95_r8 ! Reference value is 0.95
92  f_abs = 0.80_r8 ! Reference values is in the range of 0.7 - 0.95
93 
94  CALL assign_code_parameters(codeparams, return_status)
95  initial = .false.
96  END IF
97 
98  ree = f_self*(1.0_r8-f_abs)
99  roo = ree
100  roe = (1.0_r8-f_self)*(1.0_r8-f_abs)
101  reo = roe
102 
103  ALLOCATE (area_rm(1:nrho), rho_rm(1:nrho), temp(1:nrho)) ! _rm grid sizes
104  ALLOCATE (psync_ref(1:nrho-1), bmod_r(1:nrho-1), ne_r(1:nrho-1), te_r(1:nrho-1), & ! _r grid sizes
105  dvol_r(1:nrho-1), rho_r(1:nrho-1), psync_r(1:nrho-1))
106 
107  rho_rm(:) = coreprof(1)%rho_tor(:)
108 
109  ! Map surface area
110  call l3interp(equilibrium(1)%profiles_1d%surface,equilibrium(1)%profiles_1d%rho_tor, &
111  size(equilibrium(1)%profiles_1d%rho_tor), area_rm, rho_rm, nrho)
112  ! Map volume
113  call l3interp(equilibrium(1)%profiles_1d%volume,equilibrium(1)%profiles_1d%rho_tor, &
114  size(equilibrium(1)%profiles_1d%rho_tor), temp, rho_rm, nrho)
115  DO i = 1, nrho-1
116  dvol_r(i) = temp(i+1)-temp(i)
117  rho_r(i) = 0.5_r8*(rho_rm(i+1) + rho_rm(i))
118  end do
119 
120  ! Map Bmod
121  call l3interp(equilibrium(1)%profiles_1d%gm5,equilibrium(1)%profiles_1d%rho_tor, &
122  size(equilibrium(1)%profiles_1d%rho_tor), temp, rho_r, nrho-1)
123  bmod_r(1:nrho-1) =sqrt(temp(1:nrho-1))
124 
125  ! Calculate ne, Te on _rm grid
126  DO i = 1, nrho-1
127  ne_r(i) = 0.5_r8*(coreprof(1)%ne%value(i+1)+coreprof(1)%ne%value(i))
128  te_r(i) = 0.5_r8*(coreprof(1)%te%value(i+1)+coreprof(1)%te%value(i))/1.0e3_r8
129  END DO
130 
131 ! Ccalculate synchrotron radiation
132  SELECT CASE (kmodel)
133 
134  CASE (0) ! Cytran calculation
135 
136  psync_ref(:) = -0.01_r8*6.2e-20_r8*coreprof(1)%toroid_field%B0**2.0*ne_r(:)*te_r(:)*1.0e3_r8
137  CALL cytran(ree, reo, roo, roe, nrho-1, bmod_r, ne_r, te_r, area_rm, dvol_r, psync_r, k_cyt_res= 10 )
138  ! Convert from kev/m**3/s to W/m**3
139  psync_r(:) = psync_r(:) * itm_ev* 1.0e3_r8
140 
141  CASE (1) !Original ETS formula
142 
143  psync_r(:) = (-1.0_r8)**kflip*0.01_r8*6.2e-20_r8*coreprof(1)%toroid_field%B0**2.0*ne_r(:)*te_r(:)*1.0e3_r8
144 
145  END SELECT
146 
147 
148 ! Diagnostic output
149 
150  IF (kverbosity /= 0 ) THEN
151 
152  IF (kmodel == 1 ) THEN
153  write(6,*) 'CYTRAN model: '
154  write(6,*)
155  write(6,'(A38,f7.4)') ' Wall reflection coefficient',f_abs
156  write(6,'(A38,f7.4)') ' x (o) mode to x(o) mode conversion', f_self
157  write(6,*)
158  write(6,'(A38,f7.4)') ' reflection coefficients: Roo = Ree =', ree
159  write(6,'(A38,f7.4)') ' reflection coefficients: Roe = Reo =', roe
160 
161  write(6,*) ' i rho ne Te Bmod dvol Psync (MW)'
162  DO i = 1, nrho-1
163  write(6,'(i3, 7f7.3)') i, rho_r(i), ne_r(i)/1.e20, te_r(i), bmod_r(i), dvol_r(i), &
164  psync_r(i)/1.0e6_r8
165  END DO
166 
167  ELSE IF (kmodel == 0 ) THEN
168  write(6,*) 'Original ETS Formula: '
169  write(6,*)
170  if (kflip == 0 ) THEN
171  write(6,*) ' Treat term as a sink (positive sign on source - need to be negative in source combiner)'
172  ELSE IF (kflip == 1) THEN
173  write(6,*) ' Treat term as a source (negative sign on source - eed to be positive in source combiner)'
174  END IF
175  write(6,*)
176  write(6,*) ' i rho ne Te Bmod dvol Psync P_old (MW)'
177  DO i = 1, nrho-1
178  write(6,'(i3, 7f7.3)') i, rho_r(i), ne_r(i)/1.e20, te_r(i), bmod_r(i), dvol_r(i), &
179  psync_r(i)/1.0e6_r8, psync_ref(i)/1.0e6_r8
180  END DO
181  END IF
182  ENDIF
183 
184  ! Map back to output grid
185  call l3interp(psync_r, rho_r, nrho-1,temp, rho_rm, nrho)
186  temp(nrho) = temp(nrho-1) ! make a conservative extrapolation!
187 !Store in output CPO on -rm grid!
188  coresource(1)%VALUES(1)%qe%exp(1:nrho) = temp(1:nrho)
189 
190 !Add identifiers to COURESOURCE
191  ALLOCATE(coresource%values(1)%sourceid%id(1))
192  ALLOCATE(coresource(1)%values(1)%sourceid%description(1))
193  coresource(1)%values(1)%sourceid%id = 'syncrotronradiation'
194  coresource(1)%values(1)%sourceid%flag = 17
195  coresource(1)%values(1)%sourceid%description = 'Source from syncrotron radiation cytran'
196 
197 
198  IF(ALLOCATED(ntype)) DEALLOCATE (ntype)
199  IF(ALLOCATED(ncomp)) DEALLOCATE (ncomp)
200  IF(ALLOCATED(nzimp)) DEALLOCATE (nzimp)
201 
202  DEALLOCATE (area_rm, rho_rm, temp)
203  DEALLOCATE (psync_ref, bmod_r, ne_r, te_r, dvol_r, rho_r, psync_r)
204 
205 
206  RETURN
207 
208 CONTAINS
209 
210  SUBROUTINE assign_code_parameters(codeparameters, return_status)
211  USE itm_types
212  USE euitm_schemas
213  USE euitm_xml_parser
214  USE xmllib_pathquery, ONLY : xmlget
215  IMPLICIT NONE
216 
217 
218  TYPE(type_param) :: codeparameters
219  INTEGER(ITM_I4) :: return_status
220 
221  CHARACTER(len = 132) :: prefix
222 
223  TYPE(tree) :: parameter_list
224  INTEGER(ITM_I4) :: ierror, nparm
225 
226  logical :: l_flip
227 
228 
229  return_status = 0
230 
231 
232 !-- parse xml-string codeparameters%parameters
233  CALL euitm_xml_parse(codeparameters, nparm, parameter_list)
234 
235  ! Set model - check to see if CYTRAN unique values have been set
236  prefix = 'parameters/MODEL/CYTRAN/f_self'
237  CALL xmlget(parameter_list, prefix, f_self, error_flag= ierror)
238  if (ierror /= 0 ) write(6,*) 'Path; ', trim(prefix), ' = ', f_self, ' errorflag =', ierror
239  IF (ierror == 0 ) THEN ! CYTRAN
240  kmodel = 0
241  prefix = 'parameters/MODEL/CYTRAN/f_abs'
242  CALL xmlget(parameter_list, prefix, f_abs, error_flag= ierror)
243  IF (ierror /= 0 ) write(6,*) 'Path; ', trim(prefix), ' = ', f_abs, ' errorflag =', ierror
244 
245  ELSE
246  kmodel = 1
247  prefix = 'parameters/MODEL/ETS_Formula/Flip_sign'
248  CALL xmlget(parameter_list, prefix, l_flip, error_flag= ierror)
249  IF (ierror /= 0) write(6,*) 'Path; ', trim(prefix), ' = ', l_flip, ' errorflag =', ierror
250  if (l_flip) kflip =1
251  END IF
252 
253 
254  prefix = 'parameters/FLAGS/verbosity'
255 
256  CALL xmlget(parameter_list, prefix, kverbosity, error_flag= ierror)
257  IF (ierror /= 0 ) write(6,*) 'Path; ', trim(prefix), ' = ', kverbosity, ' errorflag =', ierror
258 
259 !-- destroy tree
260  CALL destroy_xml_tree(parameter_list)
261  END SUBROUTINE
262  END SUBROUTINE synchrotron_cytran
subroutine assign_code_parameters(codeparameters, return_status)
Definition: emeq.f90:671
subroutine get_comp_dimensions(COMPOSITIONS, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP)
subroutine l3interp(y_in, x_in, nr_in, y_out, x_out, nr_out)
Definition: l3interp.f90:1
This module contains routines for allocation/deallocation if CPOs used in ETS.
subroutine allocate_coresource_cpo(NSLICE, NRHO, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP, CORESOURCE)
This routine allocates CORESOURCE CPO.
subroutine synchrotron_cytran(EQUILIBRIUM, COREPROF, CORESOURCE, CODEPARAMS)
subroutine cytran(ree, reo, roo, roe, nr_r, bmod_r, den_r, te_r, area_rm, dvol_r, psync_r, K_CYT_RES)
Definition: cytran_mod.f90:78