23 TYPE (type_equilibrium
),
POINTER :: equilibrium(:)
24 TYPE (type_coreprof
),
POINTER :: coreprof(:)
25 TYPE (type_coresource
),
POINTER :: coresource(:)
26 TYPE (type_param
) :: codeparams
37 INTEGER,
ALLOCATABLE :: ntype(:), &
41 INTEGER,
PARAMETER :: nocur = 1
44 REAL(R8),
ALLOCATABLE :: psync_ref(:), &
52 REAL(R8),
SAVE :: f_self, &
54 INTEGER,
SAVE :: kmodel, &
58 REAL(R8) :: ree, roo, roe, reo
61 REAL(R8),
ALLOCATABLE :: rho_r(:), &
64 REAL(R8),
ALLOCATABLE :: temp(:)
67 INTEGER :: i , return_status
70 logical,
save :: initial = .true.
73 nrho =
SIZE (coreprof(1)%rho_tor)
74 CALL
get_comp_dimensions(coreprof(1)%compositions, nnucl, nion, nimp, nzimp, nneut, ntype, ncomp)
78 CALL copy_cpo(coreprof(1)%compositions, coresource(1)%compositions)
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)
98 ree = f_self*(1.0_r8-f_abs)
100 roe = (1.0_r8-f_self)*(1.0_r8-f_abs)
103 ALLOCATE (area_rm(1:nrho), rho_rm(1:nrho), temp(1:nrho))
104 ALLOCATE (psync_ref(1:nrho-1), bmod_r(1:nrho-1), ne_r(1:nrho-1), te_r(1:nrho-1), &
105 dvol_r(1:nrho-1), rho_r(1:nrho-1), psync_r(1:nrho-1))
107 rho_rm(:) = coreprof(1)%rho_tor(:)
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)
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)
116 dvol_r(i) = temp(i+1)-temp(i)
117 rho_r(i) = 0.5_r8*(rho_rm(i+1) + rho_rm(i))
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))
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
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 )
139 psync_r(:) = psync_r(:) * itm_ev* 1.0e3_r8
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
150 IF (kverbosity /= 0 )
THEN
152 IF (kmodel == 1 )
THEN
153 write(6,*)
'CYTRAN model: '
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
158 write(6,
'(A38,f7.4)')
' reflection coefficients: Roo = Ree =', ree
159 write(6,
'(A38,f7.4)')
' reflection coefficients: Roe = Reo =', roe
161 write(6,*)
' i rho ne Te Bmod dvol Psync (MW)'
163 write(6,
'(i3, 7f7.3)') i, rho_r(i), ne_r(i)/1.e20, te_r(i), bmod_r(i), dvol_r(i), &
167 ELSE IF (kmodel == 0 )
THEN
168 write(6,*)
'Original ETS Formula: '
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)'
176 write(6,*)
' i rho ne Te Bmod dvol Psync P_old (MW)'
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
185 call
l3interp(psync_r, rho_r, nrho-1,temp, rho_rm, nrho)
186 temp(nrho) = temp(nrho-1)
188 coresource(1)%VALUES(1)%qe%exp(1:nrho) = temp(1:nrho)
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'
198 IF(
ALLOCATED(ntype))
DEALLOCATE (ntype)
199 IF(
ALLOCATED(ncomp))
DEALLOCATE (ncomp)
200 IF(
ALLOCATED(nzimp))
DEALLOCATE (nzimp)
202 DEALLOCATE (area_rm, rho_rm, temp)
203 DEALLOCATE (psync_ref, bmod_r, ne_r, te_r, dvol_r, rho_r, psync_r)
214 USE xmllib_pathquery
, ONLY : xmlget
218 TYPE(type_param
) :: codeparameters
219 INTEGER(ITM_I4) :: return_status
221 CHARACTER(len = 132) :: prefix
223 TYPE(tree
) :: parameter_list
224 INTEGER(ITM_I4) :: ierror, nparm
233 CALL euitm_xml_parse(codeparameters, nparm, parameter_list)
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
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
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
254 prefix =
'parameters/FLAGS/verbosity'
256 CALL xmlget(parameter_list, prefix, kverbosity, error_flag= ierror)
257 IF (ierror /= 0 )
write(6,*)
'Path; ', trim(prefix),
' = ', kverbosity,
' errorflag =', ierror
260 CALL destroy_xml_tree(parameter_list)
subroutine assign_code_parameters(codeparameters, return_status)
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)
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)