ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
cytran_mod.f90
Go to the documentation of this file.
1 MODULE cytran_mod
2 !-------------------------------------------------------------------------------
3 !CYTRAN-CYclotron radiation TRANsport
4 !
5 !CYTRAN_MOD is an F90 module that calculates cyclotran radiation transport in
6 ! toroidal plasmas
7 !
8 !References:
9 !
10 ! S.Tamor, SAIC report SAI-023-81-110LJ/LAPS-71 (1981)
11 ! S.Tamor, SAIC report SAI-023-81-189LJ/LAPS-72 (1981)
12 ! D.C.Baxter, S.Tamor, SAIC report SAI-023-81-215LJ/LAPS-74 (1981)
13 ! D.C.Baxter, S.Tamor, Nucl Technol/Fusion 3 (1983) 181
14 ! W.A.Houlberg, F90 free format 8/2004
15 !
16 !Contains PUBLIC routine:
17 !
18 ! CYTRAN -cyclotron radiation transport
19 !
20 !Comments:
21 !
22 ! CYTRAN is an approximation to the cyclotron radiation transport process that
23 ! requires benchmarking against more complete transport analysis to improve
24 ! confidence in its results.
25 !
26 ! The magnetic geometry is simplified by assuming a circular cross section in a
27 ! plane of constant toroidal angle with an average magnetic field that is
28 ! only a function of minor radius.
29 !
30 ! Tamor benchmarked CYTRAN against the more complete cyclotron transport
31 ! analysis of the SNECTR code.
32 !
33 ! More recent benchmarking of CYTRAN against another cyclotron radiation code
34 ! has been carried out by:
35 ! F.Albajar, M.Bornatici, F.Engelmann, submitted to Nucl Fusion (2001)
36 !
37 ! Because the transport is expressed in terms of plasma surface area and
38 ! volumes, it can be applied to non-circular axisymmetric plasmas while
39 ! preserving the energy balance; the same is true if applied to
40 ! non-axisymmetric plasmas, but these must be viewed with more caution
41 ! because there have been no benchmark calculations for plasmas in which
42 ! field curvature in the toroidal direction may be more important.
43 !
44 ! In many places, physical and empirical constants are merged - this was done
45 ! in the original coding - and have not been unraveled in the effort to
46 ! convert to a more modern and cleaner code.
47 !
48 ! The modernization of the code structure into an F90 module takes advantage of
49 ! some of the more attractive features of F90:
50 ! -use of KIND for precision declarations
51 ! -optional arguments for I/O
52 ! -generic names for all intrinsic functions
53 ! -compilation using either free or fixed form
54 ! -no common blocks or other deprecated Fortran features
55 ! -dynamic and automatic alocation of variables
56 ! -array syntax for vector operations
57 !-------------------------------------------------------------------------------
58 USE itm_types
59 USE itm_constants
60 
61 IMPLICIT NONE
62 
63 !-------------------------------------------------------------------------------
64 ! Private procedures
65 !-------------------------------------------------------------------------------
66 PRIVATE :: &
67  cytran_opacity !cyclotron opacity coefficients
68  ! called from CYTRAN
69 
70 !-------------------------------------------------------------------------------
71 ! Private data
72 !-------------------------------------------------------------------------------
73 !-------------------------------------------------------------------------------
74 ! Public procedures
75 !-------------------------------------------------------------------------------
76 CONTAINS
77 
78 SUBROUTINE cytran(ree,reo,roo,roe,nr_r,bmod_r,den_r,te_r,area_rm,dvol_r, &
79  psync_r, &
80  k_cyt_res)
81 !-------------------------------------------------------------------------------
82 !CYTRAN estimates cyclotron radiation energy transport in toroidal plasmas
83 !
84 !References:
85 ! S.Tamor, SAIC report SAI-023-81-110LJ/LAPS-71 (1981)
86 ! S.Tamor, SAIC report SAI-023-81-189LJ/LAPS-72 (1981)
87 ! D.C.Baxter, S.Tamor, SAIC report SAI-023-81-215LJ/LAPS-74 (1981)
88 ! D.C.Baxter, S.Tamor, Nucl Technol/Fusion 3 (1983) 181
89 ! W.A.Houlberg, F90 free format 8/2004
90 !-------------------------------------------------------------------------------
91 
92 !Declaration of input variables
93 INTEGER, INTENT(IN) :: &
94  nr_r !no. of radial plasma cells [-]
95 
96 REAL(KIND=R8), INTENT(IN) :: &
97  ree, & !refl of X mode from incident X mode [0-1]
98  reo, & !refl of X mode from incident O mode [0-1]
99  roe, & !refl of O mode from incident X mode [0-1]
100  roo !refl of O mode from incident O mode [0-1]
101 
102 REAL(KIND=R8), INTENT(IN) :: &
103  bmod_r(:), & !<|B|> [T]
104  den_r(:), & !electron density in cell i [/m**3]
105  dvol_r(:), & !cell volume [m**3]
106  te_r(:), & !electron temperature in cell i [keV]
107  area_rm(:) !surface area at inner boundary of cell [m**2]
108  !plasma outer surface area is at nr_r+1
109 
110 
111 !Declaration of optional input variables
112 INTEGER, INTENT(IN), OPTIONAL :: &
113  k_cyt_res !frequency resolution level [-]
114  !=1 delta(omega)=default of 100 frequncy intervals
116  !10 recommended to keep graininess < a couple %
117 
118 
119 !Declaration of output variables
120 REAL(KIND=R8), INTENT(OUT) :: &
121  psync_r(:) !net power source/loss in cell i [keV/m**3/s]
122 
123 !-------------------------------------------------------------------------------
124 !Declaration of local variables
125 INTEGER :: &
126  i,j,k_res,nze,nzo
127 
128 REAL(KIND=R8) :: &
129  areae,areao,blackb,delw,dwght,fwght,emass,omass,extray,ordray, &
130  qee,qeo,qoe,qoo,srce,srco,taucrt,taue,tauo,testi,tse,tso,wfreq, &
131  wght,wmax,wmin,xe,xo
132 
133 REAL(KIND=R8) :: &
134  alphae(1:nr_r),alphao(1:nr_r),delta(1:nr_r),temp(1:nr_r)
135 
136 !-------------------------------------------------------------------------------
137 !Initialization
138 !-------------------------------------------------------------------------------
139 !Frequency resolution
140 k_res=1
141 
142 IF(present(k_cyt_res)) THEN
143 
144  IF(k_cyt_res > 1) k_res=k_cyt_res
145 
146 ENDIF
147 
148 !Minimum and maximum frequencies and interval
149 wmin=5.0e11_r8*minval(bmod_r(1:nr_r))
150 wmax=2.4e12_r8*maxval(bmod_r(1:nr_r))
151 delw=0.08_r8*(wmax-wmin)/k_res
152 
153 !Other
154 dwght=1
155 fwght=3
156 taucrt=0.6_r8
157 testi=0
158 extray=1.0e36_r8
159 
160 psync_r(1:nr_r)=0
161 temp(1:nr_r)=te_r(1:nr_r)*dvol_r(1:nr_r)
162 
163 DO i=1,nr_r-1 !Over radial zones
164 
165  delta(i)=2*dvol_r(i)/(area_rm(i)+area_rm(i+1))
166 
167 ENDDO !Over radial zones
168 
169 delta(nr_r)=dvol_r(nr_r)/area_rm(nr_r)
170 
171 DO j=1,100*k_res !Over frequency
172 
173  IF(extray < 0.03_r8*testi) EXIT
174 
175  wfreq=wmin+delw*REAL(j-1,r8)
176  dwght=-dwght
177  wght=fwght+dwght
178  IF(j == 1) wght=1
179  wght=wght*delw/3
180 
181  !Blackbody radiation factor (/m**2/s)
182  blackb=4.48e-20_r8*wfreq*wfreq
183 
184  !Get opacity factors
185  CALL cytran_opacity(nr_r,te_r,bmod_r,wfreq,alphae,alphao)
186  alphae(1:nr_r)=alphae(1:nr_r)*6.03e-17_r8*den_r(1:nr_r)/bmod_r(1:nr_r)
187  alphao(1:nr_r)=alphao(1:nr_r)*6.03e-17_r8*den_r(1:nr_r)/bmod_r(1:nr_r)
188 
189  taue=0
190  tauo=0
191  nze=nr_r
192  nzo=nr_r
193 
194  DO i=nr_r,1,-1 !Over radial zones
195 
196  taue=taue+alphae(i)*delta(i)
197  IF(taue < taucrt) nze=i-1
198  tauo=tauo+alphao(i)*delta(i)
199  IF(tauo < taucrt) nzo=i-1
200 
201  ENDDO !Over radial zones
202 
203  !Extraordinary mode
204  IF(nze > 0) THEN
205 
206  areae=area_rm(nze+1)
207  srce=areae*te_r(nze)
208  emass=sum(den_r(1:nr_r)*dvol_r(1:nr_r))
209 
210  ELSE
211 
212  areae=0
213  srce=0
214  emass=0
215 
216  ENDIF
217 
218  !Ordinary mode
219  IF(nzo > 0) THEN
220 
221  areao=area_rm(nzo+1)
222  srco=areao*te_r(nzo)
223  omass=sum(den_r(1:nr_r)*dvol_r(1:nr_r))
224 
225  ELSE
226 
227  areao=0
228  srco=0
229  omass=0
230 
231  ENDIF
232 
233 !Extraordinary mode
234  IF(nr_r > nze) THEN
235 
236  xe=4*sum(dvol_r(nze+1:nr_r)*alphae(nze+1:nr_r))
237  srce=srce+4*sum(temp(nze+1:nr_r)*alphae(nze+1:nr_r))
238 
239  ELSE
240 
241  xe=0
242 
243  ENDIF
244 
245 !Ordinary mode
246  IF(nr_r > nzo) THEN
247 
248  xo=4*sum(dvol_r(nzo+1:nr_r)*alphao(nzo+1:nr_r))
249  srco=srco+4*sum(temp(nzo+1:nr_r)*alphao(nzo+1:nr_r))
250 
251  ELSE
252 
253  xo=0
254 
255  ENDIF
256 
257  qee=areao+area_rm(nr_r+1)*(1.0_r8-roo)+xo
258  qoo=areae+area_rm(nr_r+1)*(1.0_r8-ree)+xe
259  qeo=reo*area_rm(nr_r+1)
260  qoe=roe*area_rm(nr_r+1)
261  extray=(qee*srce+qeo*srco)*blackb/(qee*qoo-qeo*qoe)
262  ordray=(qoe*srce+qoo*srco)*blackb/(qee*qoo-qeo*qoe)
263  testi=max(testi,extray)
264 
265  DO i=1,nr_r !Over radial zones
266 
267  !Extraordinary mode
268  IF(i <= nze) THEN
269 
270  tse=itm_pi*areae*(blackb*te_r(nze)-extray)*(den_r(i)/emass)*wght
271 
272  ELSE
273 
274  tse=4*itm_pi*alphae(i)*(blackb*te_r(i)-extray)*wght
275 
276  ENDIF
277 
278  psync_r(i)=psync_r(i)-tse
279 
280  !Ordinary mode
281  IF(i <= nzo) THEN
282 
283  tso=itm_pi*areao*(blackb*te_r(nzo)-ordray)*(den_r(i)/omass)*wght
284 
285  ELSE
286 
287  tso=4*itm_pi*alphao(i)*(blackb*te_r(i)-ordray)*wght
288 
289  ENDIF
290 
291  psync_r(i)=psync_r(i)-tso
292 
293  ENDDO !Over radial zones
294 
295 ENDDO !Over frequency
296 
297 END SUBROUTINE cytran
298 
299 SUBROUTINE cytran_opacity(nr_r,te_r,bmod_r,wfreq,alphae,alphao)
300 !-------------------------------------------------------------------------------
301 !CYTRAN_OPACITY determines the opacity coefficients for cyclotron radiation
302 !
303 !References:
304 ! S.Tamor, SAIC report SAI-023-81-110LJ/LAPS-71 (1981)
305 ! S.Tamor, SAIC report SAI-023-81-189LJ/LAPS-72 (1981)
306 ! D.C.Baxter, S.Tamor, SAIC report SAI-023-81-215LJ/LAPS-74 (1981)
307 ! D.C.Baxter, S.Tamor, Nucl Technol/Fusion 3 (1983) 181
308 ! W.A.Houlberg, F90 free format 8/2004
309 !-------------------------------------------------------------------------------
310 
311 !Declaration of input variables
312 INTEGER, INTENT(IN) :: &
313  nr_r !no. of radial cells [-]
314 
315 REAL(KIND=R8), INTENT(IN) :: &
316  wfreq !wave angular frequency [radians/s]
317 
318 REAL(KIND=R8), INTENT(IN) :: &
319  te_r(:), & !electron temperature [keV]
320  bmod_r(:)
321 
322 !Declaration of output variables
323 REAL(KIND=R8), INTENT(OUT) :: &
324  alphae(:), & !extra-ordinary mode opacity [-]
325  alphao(:) !ordinary mode opacity [-]
326 
327 !-------------------------------------------------------------------------------
328 !Declaration of local variables
329 INTEGER :: &
330  i
331 
332 REAL(KIND=R8) :: &
333  arg,tden,wloc
334 
335 DO i=1,nr_r !Over zones
336 
337  !wloc=wfreq/electron cyclotron frequency
338  wloc=wfreq/(1.7588e+11*bmod_r(i))
339  tden=1.0_r8/(4.0+te_r(i)+25.0/te_r(i))
340  arg=max(0.0_r8,0.045_r8+(wloc-2.0_r8)*tden)
341  alphae(i)=10.0**(1.45-7.8*sqrt(arg))/(wloc**2)
342  arg=max(0.0_r8,0.180_r8+(wloc-1.0_r8)*tden)
343  alphao(i)=10.0_r8**(2.45_r8-8.58_r8*sqrt(arg))/(wloc**2)
344 
345 ENDDO !Over zones
346 
347 END SUBROUTINE cytran_opacity
348 
349 END MODULE cytran_mod
350 
subroutine cytran(ree, reo, roo, roe, nr_r, bmod_r, den_r, te_r, area_rm, dvol_r, psync_r, K_CYT_RES)
Definition: cytran_mod.f90:78