1 subroutine flxint(xaxis, a, nmg, fscale)
24 real(r8),
intent(in) :: a, xaxis
25 real(r8),
intent(inout) :: fscale
26 integer(itm_i4),
intent(in) :: nmg
30 real(r8),
dimension(nr) :: psi_new, fdf_new
31 real(r8),
dimension(3) :: abltg
32 real(r8) :: factas, cur0
34 real(r8) :: ps, psr, pss, psrs, psrr, psss
35 integer(itm_i4) :: i, nelm
36 integer(itm_i4) :: n1, n2, n3, n4
37 integer(itm_i4) :: error
51 j0 = bvac / (mu0 * eps * rvac * alfa)
52 pnorm = eps * bvac**2 / (mu0 * alfa**2)
53 cur0 = -cscale / (eps * a * j0)
68 cur0 = (1._r8 + b * xaxis * (1._r8 + eps * xaxis / 2._r8)) &
69 / (1._r8 + eps * xaxis)
71 cur0 = (1._r8 + b * (1._r8 + eps * xaxis)**2) / (1._r8 + eps &
81 nelm = (i - 1) * (np - 1) + 1
83 call
interpolation(2, psi(4 * (n1 - 1) + 1), psi(4 * (n2 - 1) + 1), &
84 psi(4 * (n3 - 1) + 1), psi(4 * (n4 - 1) + 1), r, s, ps, psr, pss, &
88 psi_new(nr + 1 - i) = ps
90 fdf_new(nr + 1 - i) = (cur0 *
j_phi(ps) - b *
dp_dpsi(ps) &
96 fdf_new(nr + 1 - i) = (cur0 *
j_phi(ps) - b *
dp_dpsi(ps) &
106 fdf_new(1) = (psi_new(3) - psi_new(1)) / (psi_new(3) - psi_new(2)) &
107 * fdf_new(2) - (psi_new(2) - psi_new(1)) / (psi_new(3) - psi_new(2)) &
110 fdf_new = fdf_new / fdf_new(1)
114 call
spline(nr, psi_new, fdf_new, 0._r8, 0._r8, 2, fdf_spline)
115 write(*, *)
'before evaluate'
117 write(*, *)
'after evaluate'
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)
subroutine allocate_spline_coefficients(spline, n)
subroutine flxint(xaxis, a, nmg, fscale)
subroutine spline(N, X, Y, ALFA, BETA, TYP, A, B, C, D)
real(r8) function, public flux_surface_average(i, xaxis, a, F_dia, type, func)
subroutine deallocate_spline_coefficients(spline)
real(r8) function rquad_minus_1_over_2_r(a, x, xr, xs, yr, ys, psi, psir, F_dia)
real(r8) function one_over_r(a, x, xr, xs, yr, ys, psi, psir, F_dia)
real(r8) function r_major(a, x, xr, xs, yr, ys, psi, psir, F_dia)
subroutine set_node_number(n_node, n1, n2, n3, n4)
real(r8) function dp_dpsi(flux)
real(r8) function j_phi(flux)
subroutine evaluate_spline(p, x, x_new, f_new, error, fprime_new)