1 subroutine si_output(a, r0, b0, fcirc, qprof, dqprof, rav, geonc, &
2 zjpar, dimerc, drmerc, hh,
current)
27 real(r8),
parameter :: zmu0 = 4e-7_r8 * pi
28 real(r8),
parameter :: ze = itm_qe
30 real(r8),
dimension(nr),
intent(in) :: fcirc, qprof, dqprof, rav, &
31 geonc, dimerc, drmerc, hh
32 real(r8),
dimension(nr),
intent(inout) :: zjpar
33 real(r8),
intent(in) :: a, r0, b0,
current
35 real(r8),
dimension(nr) :: p0tmp, ftmp, dptmp, dftmp
36 real(r8),
dimension(nr) :: sr, avc, dqdpsi, dnc, stab, sp
37 real(r8),
dimension(nr) :: zni, tte, ti
38 real(r8),
dimension(nr) :: zjbt, hjbt, signeo, sigspitz, znue, znui
39 real(r8),
dimension(3) :: qp
41 real(r8) :: radius, cpsurf
43 real(r8) :: dndpsico, dtdpsico
44 real(r8) :: defte, tefte
45 real(r8) :: conste, consde
48 real(r8) :: dni, dtte, dti
50 real(r8) :: zznue, zznui, zsigsp, zsigneo, zzjbt, zhjbt
52 real(r8) :: xlength, avcur, xjac
53 real(r8) :: x, xr, xs, y, yr, ys, ps
55 real(r8) :: alfas, alfal, ef
56 real(r8) :: dlt, ssp, dqp, dnp, dip,
drp, hp, zjp, efp, ef2, shrp, dsp
57 integer(itm_i4) :: i, j
58 integer(itm_i4) :: nelm
59 integer(itm_i4) :: n1, n2, n3, n4
60 integer(itm_i4) :: ngs, nqp
61 integer(itm_i4),
parameter :: out_plot_te = 33, out_plot_ne = 34
74 if (ias == 1) factas = 1._r8
77 cpsurf = radius**2 * b0 / alfa
79 call
profiles(p0tmp, ftmp, dptmp, dftmp, a)
81 pscale = b0**2 * eps / (zmu0 * alfa**2)
85 p0tmp(i) = p0tmp(i) * pscale
86 dptmp(i) = dptmp(i) * pscale
87 ftmp(i) = ftmp(i) * rbscale
88 dftmp(i) = dftmp(i) * rbscale
91 if (standard_output)
then
93 write(out_he, *)
'*************************************************'
94 write(out_he, *)
' real world output :'
95 write(out_he, *)
'*************************************************'
98 write(out_he, 10)
current / 1000._r8
99 write(out_he, 9) radius
100 write(out_he, 8) cpsurf
102 write(out_he, 4) zeff
104 write(out_he, *)
'*************************************************'
106 write(out_he, *)
'**************************************************'
107 write(out_he, *)
' s, p [pa], ne [10^19m^-3], te [eV], ti [eV],'
108 write(out_he, *)
'**************************************************'
111 if (additional_output)
then
112 write(out_plot_te, *)
'\psi T_e ', nr - 2
113 write(out_plot_ne, *)
'\psi n_i ', nr - 2
116 if (te%shape > 0)
then
121 ps = psi(4 * (nr - i) * np + 1)
124 if (te%shape == 0)
then
125 pwr = 1._r8 / (etaei + 1._r8)
126 zni(i) = zn0 * (p0tmp(i) / p0tmp(1))**pwr
127 dni = zn0 * pwr * abs((p0tmp(i) / p0tmp(1)))**(pwr - 1._r8) &
128 * dptmp(i) / p0tmp(1) / (2._r8 * ss)
129 tte(i) = rpe * p0tmp(i) / (ze * zni(i) * 1e19_r8)
130 ti(i) = (1._r8 - rpe) * p0tmp(i) / (ze * zni(i) * 1e19_r8)
131 dtte = rpe / (ze * 1e19_r8) * (dptmp(i) / (2._r8 * ss * zni(i)) &
132 - p0tmp(i) * dni / zni(i)**2)
133 dti = (1._r8 - rpe) / (ze * 1e19_r8) * (dptmp(i) / (2._r8 &
134 * ss * zni(i)) - p0tmp(i) * dni / zni(i)**2)
136 if (ps >= ne%psi_0)
then
143 if (ps >= te%psi_0)
then
148 dtte = -dtte * 1000.0_r8
152 if (additional_output)
then
153 write (out_plot_te, *) ps, tte(i), dtte
154 write (out_plot_ne, *) ps, zni(i), dni
164 call
neo_helena(fcirc(i), tte(i), ti(i), zni(i), zeff, ftmp(i), qprof(i), &
165 rr, eps * ss, dni, dtte, dti, zznue, zznui, zsigsp, zsigneo, &
176 zjpar(i) = zjpar(i) / (zmu0 * r0 / b0**2)
178 if (standard_output) &
179 write (out_he, 7) sqrt(ps), p0tmp(i), zni(i), tte(i), ti(i), &
180 zjbt(i), hjbt(i), hjbt(i) * zmu0 * r0 / b0**2, zjpar(i)
181 if (additional_output)
then
182 write (out_plot_ne+10,*) sqrt(ps), zni(i), dni
183 write (out_plot_te+10,*) sqrt(ps), tte(i), dtte
187 if (xmgrace_output)
then
188 call
plot_data_1d(
'line', sr, zjbt, nr,
'xmgr_zjbt_rhopol')
189 call
plot_data_1d(
'line', sr, hjbt, nr,
'xmgr_hjbt_rhopol')
190 call
plot_data_1d(
'line', sr, signeo, nr,
'xmgr_signeo_rhopol')
191 call
plot_data_1d(
'line', sr, sigspitz, nr,
'xmgr_sigspitz_rhopol')
192 call
plot_data_1d(
'line', sr, znue, nr,
'xmgr_znue_rhopol')
193 call
plot_data_1d(
'line', sr, znue, nr,
'xmgr_znui_rhopol')
194 call
plot_data_1d(
'line', sr, zjpar, nr,
'xmgr_zjpar_rhopol')
202 nelm = (i - 1) * (np - 1) + j
208 call
interpolation(1, xx(1, n1), xx(1, n2), xx(1, n3), xx(1, n4), &
210 call
interpolation(1, yy(1, n1), yy(1, n2), yy(1, n3), yy(1, n4), &
212 call
interpolation(0, psi(4 * (n1 - 1) + 1), psi(4 * (n2 - 1) + 1), &
213 psi(4 * (n3 - 1) + 1), psi(4 * (n4 - 1) + 1), r, s, ps)
214 xjac = xr * ys - xs * yr
215 xlength = xlength + sqrt(xs**2 + ys**2) * ws
216 arhs =
rh_side(1._r8, x, 0._r8, 0._r8, 0._r8, 0._r8, ps, 0._r8, 0._r8)
217 avcur = avcur + ws * arhs * sqrt(xs**2 + ys**2)
220 xlength = factas * xlength
221 avc(nr - i + 1) = factas * a * eps * avcur/ (alfa * xlength)
222 avc(nr - i + 1) = avc(nr - i + 1) * b0 / (zmu0 * r0)
224 if (standard_output)
then
226 write(out_he, *)
'************************************************', &
227 '***********************'
228 write(out_he, *)
'* s, q, fcirc, nu_e, nu_i, ', &
229 ' sig(spitz),sig(neo) *'
230 write(out_he, *)
'************************************************', &
231 '***********************'
233 write(out_he, 7) sr(i), qprof(i), fcirc(i), znue(i), znui(i), &
234 sigspitz(i), signeo(i)
243 if (standard_output)
then
245 write(out_he, *)
'*****************************************'
246 write(out_he, *)
'* neoclassical stability condition *'
247 write(out_he, *)
'*****************************************'
257 p0tmp(i) = p0tmp(i) * zmu0 / b0**2
258 dptmp(i) = dptmp(i) * zmu0 / b0**2
259 ftmp(i) = ftmp(i) / rbscale
260 dftmp(i) = dftmp(i) / rbscale
262 zjbt(i) = zjbt(i) * zmu0 * r0 / b0**2
263 dqdpsi(i) = dqprof(i) / (2._r8 * sr(i) * cpsurf / (r0**2 * b0) )
264 if (dqdpsi(i) /= 0._r8)
then
265 dnc(i) = zjbt(i) / dqdpsi(i) * geonc(i)
269 if (dimerc(i) > 0._r8)
then
271 alfas = 0.5_r8 + sqrt(dimerc(i))
272 alfal = 0.5_r8 - sqrt(dimerc(i))
273 ef = -drmerc(i) - hh(i)**2
274 stab(j) = dnc(i) + (-drmerc(i)) / (alfas - hh(i))
276 if (standard_output) &
277 write(out_he, 101) sr(i), qprof(i), zjbt(i), dimerc(i), dnc(i), &
280 if (standard_output) &
281 write(out_he, 102) sr(i), qprof(i), zjbt(i), dimerc(i), dnc(i)
287 if (additional_output)
then
288 write(41, *)
' r0, b0, cpsurf, eps :'
289 write(41, 41) r0, b0, cpsurf, eps
290 write(41, *)
' i, s, p0, dp0, f, df, q, dqdpsi, j.b, d_nc : '
292 write(41, 42) i, sr(i), p0tmp(i), dptmp(i), ftmp(i), dftmp(i), &
293 qprof(i), dqdpsi(i), zjbt(i), dnc(i)
300 if (standard_output)
then
302 write(out_he, *)
' sp, q, shear, d_i, d_r,', &
303 ' e+f, h, d_nc, dsp, zjbt'
307 if (qp(i) > qprof(j) .and. qp(i) < qprof(j+1))
then
308 dlt = (qp(i) - qprof(j)) / (qprof(j + 1) - qprof(j))
309 ssp = sr(j) + dlt * (sr(j + 1) - sr(j))
310 dqp = dqprof(j) + dlt * (dqprof(j + 1) - dqprof(j))
311 dnp = dnc(j) + dlt * (dnc(j + 1) - dnc(j))
312 dip = dimerc(j) + dlt * (dimerc(j + 1) - dimerc(j))
313 drp = drmerc(j) + dlt * (drmerc(j + 1) - drmerc(j))
314 hp = hh(j) + dlt * (hh(j + 1) - hh(j))
315 zjp = zjbt(j) + dlt * (zjbt(j + 1) - zjbt(j))
317 ef2 = -dip - hp + 0.25_r8
318 shrp = dqp / qp(i) * ssp
320 if (dip >= 0._r8) dsp = 0.5_r8 - sqrt(dip) - hp
321 if (standard_output) &
322 write(out_he, 43) ssp, qp(i), shrp, -dip, -
drp, efp, ef2, &
328 1
format(
' major radius : ', f9.4,
' [m]')
329 2
format(
' magnetic field : ', f9.4,
' [T]')
330 3
format(
' central density : ', f9.4,
' 10^19 [m^-3]')
331 4
format(
' zeff : ', f9.4)
332 6
format(
' te/(te+ti) : ', f9.4)
334 8
format(
' psi on boundary : ', f9.4,
' [wb/rad]')
335 9
format(
' radius (a) : ', f9.4,
' [m]')
336 10
format(
' total current : ', f10.3,
' [kA]')
338 42
format(i4, 12es12.4)
340 102
format(
' s =', f7.3,
' q =', f7.3,
' j.b=', f7.3,
' d_i =', &
341 es10.3,
' d_nc =', e10.3,
' mercier unstable')
342 101
format(
' s =', f7.3,
' q =', f7.3,
' j.b=',f7.3,
' d_i =', &
343 es10.3,
' d_nc =', es10.3,
' d_nc+d_r/(a-h) =', es10.3)
subroutine profiles(p0, rbphi, dp0, drbphi, a)
subroutine si_output(a, r0, b0, fcirc, qprof, dqprof, rav, geonc, zjpar, dimerc, drmerc, hh, current)
subroutine interpolation(type_interp, xn1, xn2, xn3, xn4, r, s, x, xr, xs, xrs, xrr, xss, yn1, yn2, yn3, yn4, pn1, pn2, pn3, pn4, yr, ys, ps)
real(r8) function rh_side(a, x, xr, xs, yr, ys, psi, psir, F_dia)
subroutine plot_data_1d(type_plot, x, y, np, printname, z)
subroutine neo_helena(fcirc, te, ti, zzne, z, f, q, r, eps, zdne, dte, dti, znue, znui, sigspitz, signeo, zjbt, hjbt)
subroutine current(GEOMETRY, PROFILES, TRANSPORT, SOURCES, EVOLUTION, CONTROL, j_boun, ifail, failstring)
CURRENT TRANSPORT EQUATION.
subroutine set_node_number(n_node, n1, n2, n3, n4)
subroutine ne_te_profile(dt, psi, f, df, const, df_in)