17 REAL(rprec),
INTENT(in) :: plascur
18 REAL(rprec),
DIMENSION(nuv2),
INTENT(in) :: wint
21 logical :: dbgout_active
25 IF (.not.
ALLOCATED(
bvac)) stop
'BVAC unallocated in bextern'
35 if (dbgout_active)
then
38 call add_real_2d(
"mgrid_brad", nv, nu3,
brad)
39 call add_real_2d(
"mgrid_bphi", nv, nu3,
bphi)
40 call add_real_2d(
"mgrid_bz", nv, nu3,
bz)
43 call add_real(
"axis_current", plascur/mu0)
75 if (dbgout_active)
then
78 call add_real_2d(
"xpts_axis", 3, nvper * nv + 1,
xpts)
81 call add_real_2d(
"brad", nv, nu3,
brad)
82 call add_real_2d(
"bphi", nv, nu3,
bphi)
83 call add_real_2d(
"bz", nv, nu3,
bz)
85 call add_real_2d(
"bexu", nv, nu3,
bexu)
86 call add_real_2d(
"bexv", nv, nu3,
bexv)
87 call add_real_2d(
"bexn", nv, nu3,
bexn)
89 call add_real_2d(
"bexni", nv, nu3,
bexni(:nuv2))
subroutine becoil(rad, zee, brvac, bpvac, bzvac)
Compute the cylindrical components of the magnetic field due to external coils. by bi-linear interpol...
subroutine belicu(torcur, bx, by, bz, cos1, sin1, rp, zp)
Magnetic field due to net toroidal current modeled by a filament along the magnetic axis.
subroutine bextern(plascur, wint)
Compute the total magnetic field due to external coils and the net toroidal plasma current.
logical function open_dbg_context(context_name, repetition, id)
check if any output is desired for the current iteration check if the given context should be openend...
real(rprec), dimension(:,:), allocatable, target bvac
real(rprec), dimension(:), allocatable zvb
real(rprec), dimension(:), allocatable r1b
real(rprec), dimension(:), allocatable zub
real(rprec), dimension(:), allocatable bphi
real(rprec), dimension(:), allocatable z1b
real(rprec), dimension(:), allocatable bexni
real(rprec), dimension(:), allocatable snz
real(rprec), dimension(:,:), allocatable xpts
real(rprec), dimension(:), allocatable snr
real(rprec), dimension(:), allocatable rub
real(rprec), dimension(:), allocatable rvb
real(rprec), dimension(:), allocatable snv
real(rprec), dimension(:), allocatable bexv
real(rprec), dimension(:), allocatable bz
real(rprec), dimension(:), allocatable brad
real(rprec), dimension(:), allocatable bexu
real(rprec), dimension(:), allocatable bexn
integer num_eqsolve_retries