ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
delta3_combiner.f90
Go to the documentation of this file.
2 
3 
4 CONTAINS
5 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
6 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
7 
8  !-------------------------------------------------------!
9  ! This routine combines instanteneous changes !
10  ! (DELTAS) from different modules !
11  ! and interpolates them on the COREPROF grid !
12  !-------------------------------------------------------!
13  ! Source: --- !
14  ! Developers: D.Kalupin !
15  ! Kontacts: Denis.Kalupin@efda.org !
16  ! !
17  ! Comments: created for ETS workflow !
18  ! !
19  !-------------------------------------------------------!
20 
21  SUBROUTINE combine_deltas &
22  (coreprof, &
23  coredelta1, coredelta2, coredelta3, &
24  coredelta_out, code_parameters)
25 
27 
28  USE itm_constants
29  USE euitm_routines
30  USE euitm_schemas
31  USE euitm_xml_parser
32  USE deallocate_structures
33  USE interpolate_cpo
34  USE copy_structures
35 
36  IMPLICIT NONE
37 
38 
39  INTEGER, PARAMETER :: num_delta=3
40 
41 
42 ! +++ CPOs
43  TYPE (type_coreprof), POINTER :: coreprof(:)
44 
45  TYPE (type_coredelta), POINTER :: coredelta1(:)
46  TYPE (type_coredelta), POINTER :: coredelta2(:)
47  TYPE (type_coredelta), POINTER :: coredelta3(:)
48  TYPE (type_coredelta), POINTER :: coredelta_out(:)
49  TYPE (type_coredelta), POINTER :: coredelta_arr(:)
50 
51  TYPE (type_param) :: code_parameters
52 
53 
54 
55 ! +++ Control parameters:
56  REAL (R8), SAVE :: c_psi(num_delta) = 0.0_r8
57  REAL (R8), SAVE :: c_te(num_delta) = 0.0_r8
58  REAL (R8), SAVE :: c_ne(num_delta) = 0.0_r8
59  REAL (R8), SAVE :: c_ti(num_delta) = 0.0_r8
60  REAL (R8), SAVE :: c_ni(num_delta) = 0.0_r8
61  REAL (R8), SAVE :: c_tz(num_delta) = 0.0_r8
62  REAL (R8), SAVE :: c_nz(num_delta) = 0.0_r8
63  REAL (R8), SAVE :: c_vtor(num_delta) = 0.0_r8
64 
65  REAL (R8), ALLOCATABLE :: rho_tor(:)
66 
67 
68 
69  INTEGER, PARAMETER :: nslice = 1 !number of CPO ocurancies in the work flow
70  INTEGER :: nrho, irho !number of radial points (input, determined from COREPROF CPO)
71  INTEGER :: nnucl !number of nuclei species
72  INTEGER :: nion, iion !number of ion species
73  INTEGER :: nimp, iimp !number of impurity species
74  INTEGER, ALLOCATABLE :: nzimp(:) !number of ionization states for each impurity
75  INTEGER :: nneut, ineut !number of neutrals species
76  INTEGER, ALLOCATABLE :: ncomp(:) !number of components for each neutral
77  INTEGER, ALLOCATABLE :: ntype(:) !number of types for each neutral
78 
79 
80  INTEGER :: inum, ival, iarr
81  INTEGER :: return_status
82 
83 
84 
85 
86 
87  CALL assign_combiner_parameters(code_parameters, return_status)
88 
89  IF (return_status /= 0) THEN
90  WRITE(*,*) 'ERROR: Could not assign delta multipliers.'
91  END IF
92 
93 
94 
95 
96 ! +++ OUTPUT DELTA CPO:
97  nrho = SIZE(coreprof(1)%rho_tor)
98  ALLOCATE (rho_tor(nrho))
99 
100  CALL get_comp_dimensions(coreprof(1)%COMPOSITIONS, nnucl, nion, nimp, nzimp, nneut, ntype, ncomp)
101 
102  CALL allocate_coredelta_cpo(nslice, nrho, nnucl, nion, nimp, nzimp, nneut, ntype, ncomp, coredelta_out)
103  CALL allocate_coredelta_cpo(num_delta, nrho, nnucl, nion, nimp, nzimp, nneut, ntype, ncomp, coredelta_arr)
104 
105  CALL deallocate_cpo(coredelta_out(1)%compositions)
106  CALL copy_cpo(coreprof(1)%compositions, coredelta_out(1)%compositions)
107 
108 
109  rho_tor = coreprof(1)%rho_tor
110  coredelta_out(1)%VALUES(1)%rho_tor = rho_tor
111 
112  DO inum=1,num_delta
113  coredelta_arr(inum)%VALUES(1)%rho_tor = coredelta_out(1)%VALUES(1)%rho_tor
114  CALL deallocate_cpo(coredelta_arr(inum)%compositions)
115  CALL copy_cpo(coredelta_out(1)%compositions, coredelta_arr(inum)%compositions)
116  END DO
117 
118 
119 ! +++ Interpolate delta profiles on the output grid:
120  CALL interpolate_delta(coredelta1(1), coredelta_arr(1))
121  CALL interpolate_delta(coredelta2(1), coredelta_arr(2))
122  CALL interpolate_delta(coredelta3(1), coredelta_arr(3))
123 
124 
125 
126 ! +++ Combines deltas:
127  DO inum=1, num_delta
128 ! psi
129  IF (ASSOCIATED(coredelta_arr(inum)%VALUES(1)%delta_psi) .AND. c_psi(inum).NE.0.0_r8) &
130  coredelta_out(1)%VALUES(1)%delta_psi = coredelta_out(1)%VALUES(1)%delta_psi + &
131  coredelta_arr(inum)%VALUES(1)%delta_psi * c_psi(inum)
132 ! ne
133  IF (ASSOCIATED(coredelta_arr(inum)%VALUES(1)%delta_ne) .AND. c_ne(inum).NE.0.0_r8) &
134  coredelta_out(1)%VALUES(1)%delta_ne = coredelta_out(1)%VALUES(1)%delta_ne + &
135  coredelta_arr(inum)%VALUES(1)%delta_ne * c_ne(inum)
136 ! te
137  IF (ASSOCIATED(coredelta_arr(inum)%VALUES(1)%delta_te) .AND. c_te(inum).NE.0.0_r8) &
138  coredelta_out(1)%VALUES(1)%delta_te = coredelta_out(1)%VALUES(1)%delta_te + &
139  coredelta_arr(inum)%VALUES(1)%delta_te * c_te(inum)
140 ! ni
141  IF (ASSOCIATED(coredelta_arr(inum)%VALUES(1)%delta_ni) .AND. c_ni(inum).NE.0.0_r8) &
142  coredelta_out(1)%VALUES(1)%delta_ni = coredelta_out(1)%VALUES(1)%delta_ni + &
143  coredelta_arr(inum)%VALUES(1)%delta_ni * c_ni(inum)
144 ! ti
145  IF (ASSOCIATED(coredelta_arr(inum)%VALUES(1)%delta_ti) .AND. c_ti(inum).NE.0.0_r8) &
146  coredelta_out(1)%VALUES(1)%delta_ti = coredelta_out(1)%VALUES(1)%delta_ti + &
147  coredelta_arr(inum)%VALUES(1)%delta_ti * c_ti(inum)
148 ! vtor
149  IF (ASSOCIATED(coredelta_arr(inum)%VALUES(1)%delta_vtor) .AND. c_vtor(inum).NE.0.0_r8) &
150  coredelta_out(1)%VALUES(1)%delta_vtor = coredelta_out(1)%VALUES(1)%delta_vtor + &
151  coredelta_arr(inum)%VALUES(1)%delta_vtor* c_vtor(inum)
152  DO iimp = 1, nimp
153 ! nz
154  IF (ASSOCIATED(coredelta_arr(inum)%VALUES(1)%IMPURITY(iimp)%delta_nz) .AND. c_nz(inum).NE.0.0_r8) &
155  coredelta_out(1)%VALUES(1)%IMPURITY(iimp)%delta_nz = coredelta_out(1)%VALUES(1)%IMPURITY(iimp)%delta_nz + &
156  coredelta_arr(inum)%VALUES(1)%IMPURITY(iimp)%delta_nz * c_nz(inum)
157 ! tz
158  IF (ASSOCIATED(coredelta_arr(inum)%VALUES(1)%IMPURITY(iimp)%delta_tz) .AND. c_tz(inum).NE.0.0_r8) &
159  coredelta_out(1)%VALUES(1)%IMPURITY(iimp)%delta_tz = coredelta_out(1)%VALUES(1)%IMPURITY(iimp)%delta_tz + &
160  coredelta_arr(inum)%VALUES(1)%IMPURITY(iimp)%delta_tz * c_tz(inum)
161  END DO
162  END DO
163 
164 
165 
166 
167 
168 
169 ! +++ Deallocation of internal variables:
170  IF(ALLOCATED(rho_tor)) DEALLOCATE ( rho_tor )
171  IF(ALLOCATED(nzimp)) DEALLOCATE ( nzimp )
172  IF(ALLOCATED(ncomp)) DEALLOCATE ( ncomp )
173  IF(ALLOCATED(ntype)) DEALLOCATE ( ntype )
174  CALL deallocate_cpo(coredelta_arr)
175 
176 
177 
178 ! +++ ADD IDENTIFIER TO OUTPUT CPO VALUES(1):
179  ALLOCATE (coredelta_out(1)%VALUES(1)%deltaid%id(1))
180  ALLOCATE (coredelta_out(1)%VALUES(1)%deltaid%description(1))
181  coredelta_out(1)%VALUES(1)%deltaid%id = 'combined'
182  coredelta_out(1)%VALUES(1)%deltaid%flag = 4
183  coredelta_out(1)%VALUES(1)%deltaid%description = 'Combined coredelta'
184 
185 
186 
187 
188 ! +++ COPY INDIVIDUAL INPUT DELTAS TO OUTPUT CPO:
189  ALLOCATE (coredelta_arr(num_delta+1))
190  CALL copy_cpo(coredelta_out(1), coredelta_arr(1))
191  CALL copy_cpo(coredelta1(1), coredelta_arr(2))
192  CALL copy_cpo(coredelta2(1), coredelta_arr(3))
193  CALL copy_cpo(coredelta3(1), coredelta_arr(4))
194  CALL deallocate_cpo(coredelta_out(1)%VALUES)
195  ALLOCATE (coredelta_out(1)%VALUES(1+ &
196  SIZE(coredelta1(1)%VALUES)+SIZE(coredelta2(1)%VALUES)+SIZE(coredelta3(1)%VALUES)))
197 
198 
199  ival = 1
200  DO inum = 1, num_delta+1
201  DO iarr = 1, SIZE(coredelta_arr(inum)%VALUES)
202  CALL copy_cpo(coredelta_arr(inum)%VALUES(iarr), coredelta_out(1)%VALUES(ival))
203  ival = ival + 1
204  END DO
205  END DO
206 
207 
208  CALL deallocate_cpo(coredelta_arr)
209 
210 
211  RETURN
212 
213 
214  CONTAINS
215 
216 
217 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
218 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
219  SUBROUTINE assign_combiner_parameters(codeparameters, return_status)
220 
221  !-------------------------------------------------------!
222  ! This subroutine calls the XML parser for !
223  ! the combiner parameters and assign the !
224  ! resulting values to the corresponding variables !
225  !-------------------------------------------------------!
226  ! Delta: --- !
227  ! Developers: D.Kalupin !
228  ! Kontacts: Denis.Kalupin@efda.org !
229  ! !
230  ! Comments: created for V&V between ETS and !
231  ! ASTRA !
232  ! !
233  !-------------------------------------------------------!
234 
235  USE itm_types
236  USE euitm_schemas
237  USE euitm_xml_parser
238 
239  IMPLICIT NONE
240 
241 
242  TYPE(type_param) :: codeparameters
243  INTEGER(ITM_I4) :: return_status
244 
245  TYPE(tree) :: parameter_list
246  TYPE(element), POINTER :: temp_pointer
247  INTEGER(ITM_I4) :: i, nparm, n_values
248  CHARACTER(len = 132) :: cname
249  CHARACTER(len = 132) :: code_param_name
250  CHARACTER(len = 132) :: parameter_value
251  REAL (R8), SAVE :: value(1) = 0.0_r8
252 
253  INTEGER :: n_data
254 
255  return_status = 0
256 
257  c_psi = 0.0_r8
258  c_te = 0.0_r8
259  c_ne = 0.0_r8
260  c_ti = 0.0_r8
261  c_ni = 0.0_r8
262  c_tz = 0.0_r8
263  c_nz = 0.0_r8
264  c_vtor = 0.0_r8
265 
266 !-- parse xml-string codeparameters%parameters
267  CALL euitm_xml_parse(codeparameters, nparm, parameter_list)
268 
269  temp_pointer => parameter_list%first
270  code_param_name = 'parameters/PSI/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_pellet'
271  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
272  IF (len(trim(parameter_value)).GE.1) THEN
273  CALL scan_str2real(parameter_value, value, n_data)
274  c_psi(1) = value(1)
275  END IF
276  temp_pointer => parameter_list%first
277  code_param_name = 'parameters/PSI/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_sawtooth'
278  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
279  IF (len(trim(parameter_value)).GE.1) THEN
280  CALL scan_str2real(parameter_value, value, n_data)
281  c_psi(2) = value(1)
282  END IF
283  temp_pointer => parameter_list%first
284  code_param_name = 'parameters/PSI/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_elm'
285  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
286  IF (len(trim(parameter_value)).GE.1) THEN
287  CALL scan_str2real(parameter_value, value, n_data)
288  c_psi(3) = value(1)
289  END IF
290  temp_pointer => parameter_list%first
291  code_param_name = 'parameters/NE/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_pellet'
292  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
293  IF (len(trim(parameter_value)).GE.1) THEN
294  CALL scan_str2real(parameter_value, value, n_data)
295  c_ne(1) = value(1)
296  END IF
297  temp_pointer => parameter_list%first
298  code_param_name = 'parameters/NE/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_sawtooth'
299  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
300  IF (len(trim(parameter_value)).GE.1) THEN
301  CALL scan_str2real(parameter_value, value, n_data)
302  c_ne(2) = value(1)
303  END IF
304  temp_pointer => parameter_list%first
305  code_param_name = 'parameters/NE/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_elm'
306  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
307  IF (len(trim(parameter_value)).GE.1) THEN
308  CALL scan_str2real(parameter_value, value, n_data)
309  c_ne(3) = value(1)
310  END IF
311  temp_pointer => parameter_list%first
312  code_param_name = 'parameters/TE/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_pellet'
313  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
314  IF (len(trim(parameter_value)).GE.1) THEN
315  CALL scan_str2real(parameter_value, value, n_data)
316  c_te(1) = value(1)
317  END IF
318  temp_pointer => parameter_list%first
319  code_param_name = 'parameters/TE/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_sawtooth'
320  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
321  IF (len(trim(parameter_value)).GE.1) THEN
322  CALL scan_str2real(parameter_value, value, n_data)
323  c_te(2) = value(1)
324  END IF
325  temp_pointer => parameter_list%first
326  code_param_name = 'parameters/TE/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_elm'
327  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
328  IF (len(trim(parameter_value)).GE.1) THEN
329  CALL scan_str2real(parameter_value, value, n_data)
330  c_te(3) = value(1)
331  END IF
332  temp_pointer => parameter_list%first
333  code_param_name = 'parameters/NI/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_pellet'
334  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
335  IF (len(trim(parameter_value)).GE.1) THEN
336  CALL scan_str2real(parameter_value, value, n_data)
337  c_ni(1) = value(1)
338  END IF
339  temp_pointer => parameter_list%first
340  code_param_name = 'parameters/NI/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_sawtooth'
341  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
342  IF (len(trim(parameter_value)).GE.1) THEN
343  CALL scan_str2real(parameter_value, value, n_data)
344  c_ni(2) = value(1)
345  END IF
346  temp_pointer => parameter_list%first
347  code_param_name = 'parameters/NI/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_elm'
348  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
349  IF (len(trim(parameter_value)).GE.1) THEN
350  CALL scan_str2real(parameter_value, value, n_data)
351  c_ni(3) = value(1)
352  END IF
353  temp_pointer => parameter_list%first
354  code_param_name = 'parameters/TI/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_pellet'
355  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
356  IF (len(trim(parameter_value)).GE.1) THEN
357  CALL scan_str2real(parameter_value, value, n_data)
358  c_ti(1) = value(1)
359  END IF
360  temp_pointer => parameter_list%first
361  code_param_name = 'parameters/TI/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_sawtooth'
362  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
363  IF (len(trim(parameter_value)).GE.1) THEN
364  CALL scan_str2real(parameter_value, value, n_data)
365  c_ti(2) = value(1)
366  END IF
367  temp_pointer => parameter_list%first
368  code_param_name = 'parameters/TI/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_elm'
369  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
370  IF (len(trim(parameter_value)).GE.1) THEN
371  CALL scan_str2real(parameter_value, value, n_data)
372  c_ti(3) = value(1)
373  END IF
374  temp_pointer => parameter_list%first
375  code_param_name = 'parameters/VTOR/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_pellet'
376  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
377  IF (len(trim(parameter_value)).GE.1) THEN
378  CALL scan_str2real(parameter_value, value, n_data)
379  c_vtor(1) = value(1)
380  END IF
381  temp_pointer => parameter_list%first
382  code_param_name = 'parameters/VTOR/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_sawtooth'
383  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
384  IF (len(trim(parameter_value)).GE.1) THEN
385  CALL scan_str2real(parameter_value, value, n_data)
386  c_vtor(2) = value(1)
387  END IF
388  temp_pointer => parameter_list%first
389  code_param_name = 'parameters/VTOR/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_elm'
390  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
391  IF (len(trim(parameter_value)).GE.1) THEN
392  CALL scan_str2real(parameter_value, value, n_data)
393  c_vtor(3) = value(1)
394  END IF
395  temp_pointer => parameter_list%first
396  code_param_name = 'parameters/NZ/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_pellet'
397  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
398  IF (len(trim(parameter_value)).GE.1) THEN
399  CALL scan_str2real(parameter_value, value, n_data)
400  c_nz(1) = value(1)
401  END IF
402  temp_pointer => parameter_list%first
403  code_param_name = 'parameters/NZ/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_sawtooth'
404  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
405  IF (len(trim(parameter_value)).GE.1) THEN
406  CALL scan_str2real(parameter_value, value, n_data)
407  c_nz(2) = value(1)
408  END IF
409  temp_pointer => parameter_list%first
410  code_param_name = 'parameters/NZ/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_elm'
411  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
412  IF (len(trim(parameter_value)).GE.1) THEN
413  CALL scan_str2real(parameter_value, value, n_data)
414  c_nz(3) = value(1)
415  END IF
416  temp_pointer => parameter_list%first
417  code_param_name = 'parameters/PTZ/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_pellet'
418  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
419  IF (len(trim(parameter_value)).GE.1) THEN
420  CALL scan_str2real(parameter_value, value, n_data)
421  c_tz(1) = value(1)
422  END IF
423  temp_pointer => parameter_list%first
424  code_param_name = 'parameters/TZ/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_sawtooth'
425  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
426  IF (len(trim(parameter_value)).GE.1) THEN
427  CALL scan_str2real(parameter_value, value, n_data)
428  c_tz(2) = value(1)
429  END IF
430  temp_pointer => parameter_list%first
431  code_param_name = 'parameters/TZ/COMBINE_CONTRIBUTIONS_WITH_WEIGHTS/from_elm'
432  CALL find_parameter(code_param_name, parameter_value, temp_pointer)
433  IF (len(trim(parameter_value)).GE.1) THEN
434  CALL scan_str2real(parameter_value, value, n_data)
435  c_tz(3) = value(1)
436  END IF
437 
438 
439 
440 
441 !-- destroy tree
442  CALL destroy_xml_tree(parameter_list)
443 
444 
445  RETURN
446 
447  END SUBROUTINE assign_combiner_parameters
448 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
449 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
450 
451 
452  END SUBROUTINE combine_deltas
453 
454 
455 
456 END MODULE delta3_combiner
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)