22 (coreprof, coredelta1, coredelta2, &
23 coredelta_out, code_parameters)
31 USE deallocate_structures
38 INTEGER,
PARAMETER :: num_delta=2
42 TYPE (type_coreprof
),
POINTER :: coreprof(:)
44 TYPE (type_coredelta
),
POINTER :: coredelta1(:)
45 TYPE (type_coredelta
),
POINTER :: coredelta2(:)
46 TYPE (type_coredelta
),
POINTER :: coredelta_out(:)
47 TYPE (type_coredelta
),
POINTER :: coredelta_arr(:)
49 TYPE (type_param
) :: code_parameters
54 REAL (R8),
SAVE :: c_psi(num_delta) = 0.0_r8
55 REAL (R8),
SAVE :: c_te(num_delta) = 0.0_r8
56 REAL (R8),
SAVE :: c_ne(num_delta) = 0.0_r8
57 REAL (R8),
SAVE :: c_ti(num_delta) = 0.0_r8
58 REAL (R8),
SAVE :: c_ni(num_delta) = 0.0_r8
59 REAL (R8),
SAVE :: c_tz(num_delta) = 0.0_r8
60 REAL (R8),
SAVE :: c_nz(num_delta) = 0.0_r8
61 REAL (R8),
SAVE :: c_vtor(num_delta) = 0.0_r8
63 REAL (R8),
ALLOCATABLE :: rho_tor(:)
67 INTEGER,
PARAMETER :: nslice = 1
72 INTEGER,
ALLOCATABLE :: nzimp(:)
73 INTEGER :: nneut, ineut
74 INTEGER,
ALLOCATABLE :: ncomp(:)
75 INTEGER,
ALLOCATABLE :: ntype(:)
78 INTEGER :: inum, ival, iarr
79 INTEGER :: return_status
87 IF (return_status /= 0)
THEN
88 WRITE(*,*)
'ERROR: Could not assign delta multipliers.'
95 nrho =
SIZE(coreprof(1)%rho_tor)
96 ALLOCATE (rho_tor(nrho))
98 CALL
get_comp_dimensions(coreprof(1)%COMPOSITIONS, nnucl, nion, nimp, nzimp, nneut, ntype, ncomp)
101 CALL
allocate_coredelta_cpo(num_delta, nrho, nnucl, nion, nimp, nzimp, nneut, ntype, ncomp, coredelta_arr)
103 CALL deallocate_cpo(coredelta_out(1)%compositions)
104 CALL copy_cpo(coreprof(1)%compositions, coredelta_out(1)%compositions)
107 rho_tor = coreprof(1)%rho_tor
108 coredelta_out(1)%VALUES(1)%rho_tor = rho_tor
111 coredelta_arr(inum)%VALUES(1)%rho_tor = coredelta_out(1)%VALUES(1)%rho_tor
112 CALL deallocate_cpo(coredelta_arr(inum)%compositions)
113 CALL copy_cpo(coredelta_out(1)%compositions, coredelta_arr(inum)%compositions)
126 IF (
ASSOCIATED(coredelta_arr(inum)%VALUES(1)%delta_psi) .AND. c_psi(inum).NE.0.0_r8) &
127 coredelta_out(1)%VALUES(1)%delta_psi = coredelta_out(1)%VALUES(1)%delta_psi + &
128 coredelta_arr(inum)%VALUES(1)%delta_psi * c_psi(inum)
130 IF (
ASSOCIATED(coredelta_arr(inum)%VALUES(1)%delta_ne) .AND. c_ne(inum).NE.0.0_r8) &
131 coredelta_out(1)%VALUES(1)%delta_ne = coredelta_out(1)%VALUES(1)%delta_ne + &
132 coredelta_arr(inum)%VALUES(1)%delta_ne * c_ne(inum)
134 IF (
ASSOCIATED(coredelta_arr(inum)%VALUES(1)%delta_te) .AND. c_te(inum).NE.0.0_r8) &
135 coredelta_out(1)%VALUES(1)%delta_te = coredelta_out(1)%VALUES(1)%delta_te + &
136 coredelta_arr(inum)%VALUES(1)%delta_te * c_te(inum)
138 IF (
ASSOCIATED(coredelta_arr(inum)%VALUES(1)%delta_ni) .AND. c_ni(inum).NE.0.0_r8) &
139 coredelta_out(1)%VALUES(1)%delta_ni = coredelta_out(1)%VALUES(1)%delta_ni + &
140 coredelta_arr(inum)%VALUES(1)%delta_ni * c_ni(inum)
142 IF (
ASSOCIATED(coredelta_arr(inum)%VALUES(1)%delta_ti) .AND. c_ti(inum).NE.0.0_r8) &
143 coredelta_out(1)%VALUES(1)%delta_ti = coredelta_out(1)%VALUES(1)%delta_ti + &
144 coredelta_arr(inum)%VALUES(1)%delta_ti * c_ti(inum)
146 IF (
ASSOCIATED(coredelta_arr(inum)%VALUES(1)%delta_vtor) .AND. c_vtor(inum).NE.0.0_r8) &
147 coredelta_out(1)%VALUES(1)%delta_vtor = coredelta_out(1)%VALUES(1)%delta_vtor + &
148 coredelta_arr(inum)%VALUES(1)%delta_vtor* c_vtor(inum)
151 IF (
ASSOCIATED(coredelta_arr(inum)%VALUES(1)%IMPURITY(iimp)%delta_nz) .AND. c_nz(inum).NE.0.0_r8) &
152 coredelta_out(1)%VALUES(1)%IMPURITY(iimp)%delta_nz = coredelta_out(1)%VALUES(1)%IMPURITY(iimp)%delta_nz + &
153 coredelta_arr(inum)%VALUES(1)%IMPURITY(iimp)%delta_nz * c_nz(inum)
155 IF (
ASSOCIATED(coredelta_arr(inum)%VALUES(1)%IMPURITY(iimp)%delta_tz) .AND. c_tz(inum).NE.0.0_r8) &
156 coredelta_out(1)%VALUES(1)%IMPURITY(iimp)%delta_tz = coredelta_out(1)%VALUES(1)%IMPURITY(iimp)%delta_tz + &
157 coredelta_arr(inum)%VALUES(1)%IMPURITY(iimp)%delta_tz * c_tz(inum)
167 IF(
ALLOCATED(rho_tor))
DEALLOCATE ( rho_tor )
168 IF(
ALLOCATED(nzimp))
DEALLOCATE ( nzimp )
169 IF(
ALLOCATED(ncomp))
DEALLOCATE ( ncomp )
170 IF(
ALLOCATED(ntype))
DEALLOCATE ( ntype )
171 CALL deallocate_cpo(coredelta_arr)
176 ALLOCATE (coredelta_out(1)%VALUES(1)%deltaid%id(1))
177 ALLOCATE (coredelta_out(1)%VALUES(1)%deltaid%description(1))
178 coredelta_out(1)%VALUES(1)%deltaid%id =
'combined'
179 coredelta_out(1)%VALUES(1)%deltaid%flag = 4
180 coredelta_out(1)%VALUES(1)%deltaid%description =
'Combined coredelta'
186 ALLOCATE (coredelta_arr(num_delta+1))
187 CALL copy_cpo(coredelta_out(1), coredelta_arr(1))
188 CALL copy_cpo(coredelta1(1), coredelta_arr(2))
189 CALL copy_cpo(coredelta2(1), coredelta_arr(3))
190 CALL deallocate_cpo(coredelta_out(1)%VALUES)
191 ALLOCATE (coredelta_out(1)%VALUES(1+
SIZE(coredelta1(1)%VALUES)+
SIZE(coredelta2(1)%VALUES)))
195 DO inum = 1, num_delta+1
196 DO iarr = 1,
SIZE(coredelta_arr(inum)%VALUES)
197 CALL copy_cpo(coredelta_arr(inum)%VALUES(iarr), coredelta_out(1)%VALUES(ival))
203 CALL deallocate_cpo(coredelta_arr)
237 TYPE(type_param
) :: codeparameters
238 INTEGER(ITM_I4) :: return_status
240 TYPE(tree
) :: parameter_list
241 TYPE(element
),
POINTER :: temp_pointer
242 INTEGER(ITM_I4) :: i, nparm, n_values
243 CHARACTER(len = 132) :: cname
244 CHARACTER(len = 132) :: code_param_name
245 CHARACTER(len = 132) :: parameter_value
246 REAL (R8),
SAVE :: value(1) = 0.0_r8
262 CALL euitm_xml_parse(codeparameters, nparm, parameter_list)
264 temp_pointer => parameter_list%first
265 code_param_name =
'parameters/PSI/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_pellet'
266 CALL find_parameter(code_param_name, parameter_value, temp_pointer)
267 IF (len(trim(parameter_value)).GE.1)
THEN
268 CALL scan_str2real(parameter_value, value, n_data)
271 temp_pointer => parameter_list%first
272 code_param_name =
'parameters/PSI/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_sawtooth'
273 CALL find_parameter(code_param_name, parameter_value, temp_pointer)
274 IF (len(trim(parameter_value)).GE.1)
THEN
275 CALL scan_str2real(parameter_value, value, n_data)
278 temp_pointer => parameter_list%first
279 code_param_name =
'parameters/NE/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_pellet'
280 CALL find_parameter(code_param_name, parameter_value, temp_pointer)
281 IF (len(trim(parameter_value)).GE.1)
THEN
282 CALL scan_str2real(parameter_value, value, n_data)
285 temp_pointer => parameter_list%first
286 code_param_name =
'parameters/NE/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_sawtooth'
287 CALL find_parameter(code_param_name, parameter_value, temp_pointer)
288 IF (len(trim(parameter_value)).GE.1)
THEN
289 CALL scan_str2real(parameter_value, value, n_data)
292 temp_pointer => parameter_list%first
293 code_param_name =
'parameters/TE/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_pellet'
294 CALL find_parameter(code_param_name, parameter_value, temp_pointer)
295 IF (len(trim(parameter_value)).GE.1)
THEN
296 CALL scan_str2real(parameter_value, value, n_data)
299 temp_pointer => parameter_list%first
300 code_param_name =
'parameters/TE/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_sawtooth'
301 CALL find_parameter(code_param_name, parameter_value, temp_pointer)
302 IF (len(trim(parameter_value)).GE.1)
THEN
303 CALL scan_str2real(parameter_value, value, n_data)
306 temp_pointer => parameter_list%first
307 code_param_name =
'parameters/NI/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_pellet'
308 CALL find_parameter(code_param_name, parameter_value, temp_pointer)
309 IF (len(trim(parameter_value)).GE.1)
THEN
310 CALL scan_str2real(parameter_value, value, n_data)
313 temp_pointer => parameter_list%first
314 code_param_name =
'parameters/NI/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_sawtooth'
315 CALL find_parameter(code_param_name, parameter_value, temp_pointer)
316 IF (len(trim(parameter_value)).GE.1)
THEN
317 CALL scan_str2real(parameter_value, value, n_data)
320 temp_pointer => parameter_list%first
321 code_param_name =
'parameters/TI/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_pellet'
322 CALL find_parameter(code_param_name, parameter_value, temp_pointer)
323 IF (len(trim(parameter_value)).GE.1)
THEN
324 CALL scan_str2real(parameter_value, value, n_data)
327 temp_pointer => parameter_list%first
328 code_param_name =
'parameters/TI/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_sawtooth'
329 CALL find_parameter(code_param_name, parameter_value, temp_pointer)
330 IF (len(trim(parameter_value)).GE.1)
THEN
331 CALL scan_str2real(parameter_value, value, n_data)
334 temp_pointer => parameter_list%first
335 code_param_name =
'parameters/VTOR/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_pellet'
336 CALL find_parameter(code_param_name, parameter_value, temp_pointer)
337 IF (len(trim(parameter_value)).GE.1)
THEN
338 CALL scan_str2real(parameter_value, value, n_data)
341 temp_pointer => parameter_list%first
342 code_param_name =
'parameters/VTOR/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_sawtooth'
343 CALL find_parameter(code_param_name, parameter_value, temp_pointer)
344 IF (len(trim(parameter_value)).GE.1)
THEN
345 CALL scan_str2real(parameter_value, value, n_data)
348 temp_pointer => parameter_list%first
349 code_param_name =
'parameters/NZ/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_pellet'
350 CALL find_parameter(code_param_name, parameter_value, temp_pointer)
351 IF (len(trim(parameter_value)).GE.1)
THEN
352 CALL scan_str2real(parameter_value, value, n_data)
355 temp_pointer => parameter_list%first
356 code_param_name =
'parameters/NZ/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_sawtooth'
357 CALL find_parameter(code_param_name, parameter_value, temp_pointer)
358 IF (len(trim(parameter_value)).GE.1)
THEN
359 CALL scan_str2real(parameter_value, value, n_data)
362 temp_pointer => parameter_list%first
363 code_param_name =
'parameters/PTZ/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_pellet'
364 CALL find_parameter(code_param_name, parameter_value, temp_pointer)
365 IF (len(trim(parameter_value)).GE.1)
THEN
366 CALL scan_str2real(parameter_value, value, n_data)
369 temp_pointer => parameter_list%first
370 code_param_name =
'parameters/TZ/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_sawtooth'
371 CALL find_parameter(code_param_name, parameter_value, temp_pointer)
372 IF (len(trim(parameter_value)).GE.1)
THEN
373 CALL scan_str2real(parameter_value, value, n_data)
381 CALL destroy_xml_tree(parameter_list)
subroutine allocate_coredelta_cpo(NSLICE, NRHO, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP, COREDELTA)
This routine allocates COREDELTA CPO.
subroutine get_comp_dimensions(COMPOSITIONS, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP)
subroutine combine_deltas(COREPROF, COREDELTA1, COREDELTA2, COREDELTA3, COREDELTA_OUT, code_parameters)
subroutine interpolate_delta(COREDELTA_IN, COREDELTA_OUT)
This module contains routines for allocation/deallocation if CPOs used in ETS.
subroutine assign_combiner_parameters(codeparameters, return_status)