ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
equilibrium_start.F90
Go to the documentation of this file.
1 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
10 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
12 
13 CONTAINS
14 
15 
16 
17 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
18 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
19 
21  (prof_flag, j0_flag, q0_flag, ext_equil, &
22  coreprof_in, equilibrium_in, toroidfield_in, coreprof_out, equilibrium_out)
23 
24 !-------------------------------------------------------!
25 ! This routine checks for the consistency of !
26 ! profiles (psi, q, jparallel) and equilibrium !
27 ! !
28 ! information received in: COREPROF_IN !
29 ! EQUILIBRIUM_IN. !
30 ! TOROIDFIELD_IN. !
31 ! EQUILIBRIUM_IN. !
32 ! !
33 ! information saved in: COREPROF_OUT !
34 ! EQUILIBRIUM_OUT. !
35 ! !
36 ! controling parameter: PROF_FLAG !
37 ! EXT_EQUIL !
38 ! !
39 !-------------------------------------------------------!
40 ! Source: --- !
41 ! Developers: D.Kalupin !
42 ! Kontacts: Denis.Kalupin@efda.org !
43 ! !
44 ! Comments: created for V&V between ETS, JETTO !
45 ! and ASTRA !
46 ! !
47 !-------------------------------------------------------!
48 
49 
50  USE euitm_schemas
51  USE euitm_routines
52  USE copy_structures
53  USE deallocate_structures
54 
58 #ifdef GOT_HELENA
60 #endif
61 #ifdef GOT_CHEASE
63 #endif
64 
66  USE itm_constants
68 
69  IMPLICIT NONE
70 
71  INTEGER :: ifail
72 
73 ! +++ CPO derived types:
74  TYPE (type_equilibrium), POINTER :: equilibrium_in(:) !input CPO with geometry quantities from previous time
75  TYPE (type_equilibrium), POINTER :: equilibrium_out(:) !output CPO with geometry quantities from previous iteration
76  TYPE (type_toroidfield), POINTER :: toroidfield_in(:) !toroidal field, major radius, total current
77  TYPE (type_coreprof), POINTER :: coreprof_in(:) !input CPO with plasma profiles
78  TYPE (type_coreprof), POINTER :: coreprof_iter(:) !iterration CPO with plasma profiles
79  TYPE (type_coreprof), POINTER :: coreprof_out(:) !output CPO with plasma profiles
80  TYPE (type_coreprof), POINTER :: coreprof_new(:) !output CPO with plasma profiles
81 
82 
83 ! +++ Dimensions:
84  INTEGER :: prof_flag, flag !determines primary profile
85  INTEGER :: j0_flag !flag for negative current, if J0_FLAG>0 negative current will be cut off
86  INTEGER :: q0_flag !Flag for positive dq/drho: 0-allowed, >0-cut off
87  INTEGER :: ext_equil !determines equilibrium module connected
88  INTEGER :: index
89 
90 
91 ! +++ Local parameters:
92  REAL (R8) :: err_psi, err_q , err_jpar
93  REAL (R8) :: conv
94 
95  flag = 3 ! primary iterrations on current
96  index = 0 ! Starting from parabolic profiles
97 
98 
99 !DPC
100  coreprof_in(1)%rho_tor = coreprof_in(1)%rho_tor &
101  / coreprof_in(1)%rho_tor(SIZE(coreprof_in(1)%rho_tor, dim=1)) &
102  * equilibrium_in(1)%profiles_1d%rho_tor(SIZE (equilibrium_in(1)%profiles_1d%psi, dim=1))
103 !CPD
104 
105  ALLOCATE (coreprof_iter(1))
106  ALLOCATE (coreprof_new(1))
107  CALL copy_cpo(coreprof_in(1), coreprof_iter(1))
108  CALL copy_cpo(coreprof_in(1), coreprof_new(1))
109 
110 
111 ! +++ Replace starting profiles with parabolas:
112  CALL parabolic_prof(coreprof_in, equilibrium_in, &
113  coreprof_out, equilibrium_out)
114 
115 
116 
117 ! +++ Provide consistent input for equilibrium:
118  7 CALL equil_input(coreprof_out, toroidfield_in, equilibrium_out, equilibrium_in)
119 
120 
121 
122 ! +++ Call the selected equilibrium:
123  IF (ext_equil.EQ.1) THEN
124  CALL bdseq_wrapper(equilibrium_in, equilibrium_out)
125  ELSE IF(ext_equil.EQ.2) THEN
126  CALL emeq_e3m_wrapper(equilibrium_in, equilibrium_out)
127  ELSE IF(ext_equil.EQ.3) THEN
128 #ifdef GOT_HELENA
129  CALL deallocate_cpo(equilibrium_out)
130  CALL helena_wrapper(equilibrium_in, equilibrium_out)
131 #else
132  WRITE(*,*) 'No HELENA available at compile time'
133  stop 'No HELENA'
134 #endif
135  ELSE IF (ext_equil.EQ.4) THEN
136 #ifdef GOT_CHEASE
137  CALL deallocate_cpo(equilibrium_out)
138  CALL chease_wrapper(equilibrium_in, equilibrium_out)
139 #else
140  WRITE(*,*) 'No CHEASE available at compile time'
141  stop 'No CHEASE'
142 #endif
143  END IF
144 
145 !DPC
146  coreprof_out(1)%rho_tor = coreprof_out(1)%rho_tor &
147  / coreprof_out(1)%rho_tor(SIZE(coreprof_out(1)%rho_tor, dim=1)) &
148  * equilibrium_out(1)%profiles_1d%rho_tor(SIZE (equilibrium_out(1)%profiles_1d%psi, dim=1))
149 !CPD
150 
151 
152 
153 ! +++ Readjust profiles:
154  CALL readjust_profiles &
155  (3, q0_flag, coreprof_out, equilibrium_out, coreprof_in)
156 
157 
158 
159 ! +++ Check for negative currents and total current:
160  CALL correct_current_prof(1, coreprof_in, equilibrium_out, coreprof_out)
161 
162 
163 
164 ! +++ Check for convergence of profiles :
165  err_psi = maxval(abs(1.0_r8 - abs(coreprof_iter(1)%psi%value(2:) / coreprof_out(1)%psi%value(2:))))
166  err_q = maxval(abs(1.0_r8 - abs(coreprof_iter(1)%profiles1d%q%value(2:) / coreprof_out(1)%profiles1d%q%value(2:))))
167  err_jpar = maxval(abs(1.0_r8 - abs(coreprof_iter(1)%profiles1d%jtot%value(2:) / coreprof_out(1)%profiles1d%jtot%value(2:))))
168 
169  conv = max(err_psi, err_q , err_jpar)
170 
171  write(*,'(a,1p,4(1x,g12.5))') 'START_PROFILES_CONSISTENCY convergence (inner): ', conv, err_psi, err_q, err_jpar
172 
173 ! +++ Fill the iterration CPO with readjusted profiles:
174  CALL copy_cpo(coreprof_out(1), coreprof_iter(1))
175 
176 
177 
178  IF (conv.GT.0.001_r8) goto 7
179 
180 
181 
182 ! +++ Insert experimental profiles:
183  CALL readjust_profiles(prof_flag, q0_flag, coreprof_new, equilibrium_out, coreprof_out)
184 
185 
186 
187 ! +++ Check for convergence of profiles :
188  err_psi = maxval(abs(1.0_r8 - abs(coreprof_out(1)%psi%value(2:) / coreprof_new(1)%psi%value(2:))))
189  err_q = maxval(abs(1.0_r8 - abs(coreprof_out(1)%profiles1d%q%value(2:) / coreprof_new(1)%profiles1d%q%value(2:))))
190  err_jpar = maxval(abs(1.0_r8 - abs(coreprof_out(1)%profiles1d%jtot%value(2:) / coreprof_new(1)%profiles1d%jtot%value(2:))))
191 
192  conv = max(err_psi, err_q , err_jpar)
193 
194  write(*,'(a,1p,4(1x,g12.5))') 'START_PROFILES_CONSISTENCY convergence (outer): ', conv, err_psi, err_q, err_jpar
195 
196  CALL copy_cpo(coreprof_out(1), coreprof_new(1))
197 
198  IF (conv.GT.0.001_r8) goto 7
199 
200 
201 
202 
203 ! +++ Deallocate CPOs:
204  CALL deallocate_cpo(coreprof_iter)
205  CALL deallocate_cpo(coreprof_new)
206 
207 
208 
209  RETURN
210 
211 
212  END SUBROUTINE start_profiles_consistency
213 
214 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
215 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
216 
217 
218 
219 
220 
221 
222 
223 
224 END MODULE equilibrium_start
225 
226 
227 
228 
wrapper for HELENA
subroutine equil_input(COREPROF_IN, TOROIDFIELD_IN, EQUILIBRIUM_IN, EQUILIBRIUM_OUT)
wrapper for CHEASE
EQUILIBRIUM_INPUT.
subroutine emeq_e3m_wrapper(EQUILIBRIUM_in, EQUILIBRIUM_out)
wrapper for BDSEQ
subroutine parabolic_prof(COREPROF_IN, EQUILIBRIUM_IN, COREPROF_OUT, EQUILIBRIUM_OUT)
subroutine chease_wrapper(euitm_equilibrium_in, euitm_equilibrium_out)
subroutine helena_wrapper(euitm_equilibrium_in, euitm_equilibrium_out)
This module contains routines for allocation/deallocation if CPOs used in ETS.
EQUILIBRIUM_START.
subroutine readjust_profiles(PROF_FLAG, Q0_FLAG, COREPROF_IN, EQUILIBRIUM_IN, COREPROF_OUT)
program bdseq_wrapper
Definition: wrapper.F90:208
subroutine correct_current_prof(J0_FLAG, COREPROF_IN, EQUILIBRIUM, COREPROF_OUT)
subroutine start_profiles_consistency(PROF_FLAG, J0_FLAG, Q0_FLAG, EXT_EQUIL, COREPROF_IN, EQUILIBRIUM_IN, TOROIDFIELD_IN, COREPROF_OUT, EQUILIBRIUM_OUT)