ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
neutrals_settings.f90
Go to the documentation of this file.
1 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
8 
9 
10 
11  CONTAINS
12 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
13 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
19  SUBROUTINE get_neutrals_settings (COREPROF, NEUTRALS, codeparameters)
20 
21 !-------------------------------------------------------!
22 ! This subroutine reads settings for NEUTRALS !
23 ! from XML file !
24 !-------------------------------------------------------!
25 ! Source: --- !
26 ! Developers: D.Kalupin !
27 ! Contacts: D.Kalupin@fz-juelich.de !
28 ! !
29 ! Comments: --- !
30 ! !
31 !-------------------------------------------------------!
32 
33  USE type_neutrals
34  USE itm_constants
35  USE itm_types
36  USE euitm_schemas
37  USE euitm_xml_parser
38 
39  IMPLICIT NONE
40 
41 ! +++ External derived types and CPO
42  TYPE (type_coreprof), POINTER :: coreprof(:) !input CPO with internal ETS parameters profiles
43  TYPE (neutral_profiles) :: neutrals !contains profiles of incoming neutrals
44  TYPE (type_param) :: codeparameters
45 
46 
47 ! +++ Boundary conditions:
48  INTEGER :: neu_bnd_type !type of boundary conditions
49  INTEGER :: nrho
50  REAL (R8) :: n0_bnd !boundary conditions (value)
51  REAL (R8) :: t0_bnd !boundary conditions (value)
52 
53 ! +++ Coefficients:
54  REAL (R8) :: coef_recycle !recycling coefficient
55 
56  INTEGER :: return_status
57 
58  nrho = SIZE (coreprof(1)%rho_tor, dim=1)
59 
60  CALL assign_neutrals_parameters(codeparameters, return_status)
61 
62  IF (return_status /= 0) THEN
63  WRITE(*,*) 'ERROR: Could not assign NEUTRALS settings.'
64  END IF
65 
66 
67 
68 
69 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
70 ! +++ Copy settings into NEUTRALS derived type:
71 
72 ! from XML:
73  neutrals%NEU_BND_TYPE(1) = neu_bnd_type
74  neutrals%NEU_BND(1,1) = n0_bnd
75  neutrals%N0(nrho,1,1) = n0_bnd
76  neutrals%T0(nrho,1,1) = t0_bnd
77  neutrals%COEF_RECYCLE = coef_recycle
78 
79 ! from CPO:
80  neutrals%MION = coreprof(1)%composition%amn
81 
82 
83 
84 
85  RETURN
86 
87 
88 CONTAINS
89 
90 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
91 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
97 SUBROUTINE assign_neutrals_parameters(codeparameters, return_status)
98 
99  !-------------------------------------------------------!
100  ! This subroutine calls the XML parser for !
101  ! the neutrals settings and assign the !
102  ! resulting values to the corresponding variables !
103  !-------------------------------------------------------!
104  ! Source: --- !
105  ! Developers: D.Kalupin !
106  ! Kontacts: Denis.Kalupin@efda.org !
107  ! !
108  ! Comments: created for V&V between ETS and !
109  ! ASTRA !
110  ! !
111  !-------------------------------------------------------!
112 
113  USE itm_types
114  USE euitm_schemas
115  USE euitm_xml_parser
116 
117  IMPLICIT NONE
118 
119 
120  TYPE(type_param) :: codeparameters
121  INTEGER(ITM_I4) :: return_status
122 
123  TYPE(tree) :: parameter_list
124  TYPE(element), POINTER :: temp_pointer
125  INTEGER(ITM_I4) :: i, nparm, n_values
126  CHARACTER(len = 132) :: cname
127 
128 
129  return_status = 0 ! no error
130 
131 !-- parse xml-string codeparameters%parameters
132 
133  WRITE(6,*) 'Calling euitm_xml_parse'
134  CALL euitm_xml_parse(codeparameters, nparm, parameter_list)
135  WRITE(6,*) 'Called euitm_xml_parse'
136 
137 !-- assign variables
138 
139  temp_pointer => parameter_list%first
140 
141  outer: do
142  cname = char2str(temp_pointer%cname) ! necessary for AIX
143  select case (cname)
144 
145 
146 !-- parameters overall
147  case ("parameters")
148  temp_pointer => temp_pointer%child
149  cycle
150 
151 !-- boundary conditions for neutrals
152  case ("boundary_conditions")
153  temp_pointer => temp_pointer%child
154  cycle
155 
156  case ("n0_bnd")
157  if (allocated(temp_pointer%cvalue)) &
158  call char2num(temp_pointer%cvalue, n0_bnd)
159  case ("t0_bnd")
160  if (allocated(temp_pointer%cvalue)) &
161  call char2num(temp_pointer%cvalue, t0_bnd)
162  case ("neu_bnd_type")
163  if (allocated(temp_pointer%cvalue)) &
164  call char2num(temp_pointer%cvalue, neu_bnd_type)
165 
166 
167 !-- Coefficients
168  case ("coefficients")
169  temp_pointer => temp_pointer%child
170  cycle
171 
172  case ("coef_recycle")
173  if (allocated(temp_pointer%cvalue)) &
174  call char2num(temp_pointer%cvalue, coef_recycle)
175 
176 
177  case default
178  write(*, *) 'ERROR: invalid parameter', cname
179  return_status = 1
180  exit
181  end select
182 
183 
184  do
185  if (associated(temp_pointer%sibling)) then
186  temp_pointer => temp_pointer%sibling
187  exit
188  end if
189  if (associated(temp_pointer%parent, parameter_list%first )) &
190  exit outer
191  if (associated(temp_pointer%parent)) then
192  temp_pointer => temp_pointer%parent
193  else
194  write(*, *) 'ERROR: broken list.'
195  return
196  end if
197  end do
198  end do outer
199 
200 !-- destroy tree
201  CALL destroy_xml_tree(parameter_list)
202 
203 
204  RETURN
205 
206 END SUBROUTINE assign_neutrals_parameters
207 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
208 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
209 
210 
211 END SUBROUTINE get_neutrals_settings
212 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
213 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
214 
215 
216 END MODULE neutrals_settings
subroutine assign_neutrals_parameters(codeparameters, return_status)
subroutine get_neutrals_settings(COREPROF, NEUTRALS, codeparameters)
??