13SUBROUTINE scalpot(bvec, amatrix, wint, ivacskip, lasym, m_map, n_map)
21 INTEGER,
INTENT(in) :: ivacskip
22 REAL(rprec),
INTENT(out) :: bvec(mnpd2), amatrix(mnpd2*mnpd2), m_map(mnpd2), n_map(mnpd2)
23 REAL(rprec),
dimension(nuv2),
INTENT(in) :: wint
24 logical,
intent(in) :: lasym
28 IF (.not.
ALLOCATED(
amatsav))
then
29 stop
'AMATSAV not allocated in scalpot'
39 IF (ivacskip .ne. 0)
THEN
72 call add_real_4d(
"green", nv, nu, nv, nu3,
green)
73 call add_real_4d(
"greenp", nv, nu, nv, nu3,
greenp)
75 call add_real_2d(
"gstore", nv, nu,
gstore)
subroutine analyt(grpmn, bvec, ivacskip, lasym, m_map, n_map, grpmn_m_map, grpmn_n_map)
Compute the analytical-and-numerical 4D Fourier integrals over the equivalently-singular functions.
subroutine fouri(grpmn, gsource, amatrix, amatsq, bvec, wint, lasym)
Compute Fourier integrals and build amatrix.
subroutine fourp(grpmn, grp)
Perform Fourier integrals of Green's function kernel.
subroutine greenf(delgr, delgrp, ip)
Compute the regularized evaluation of the Green's function and the source term.
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 bvecsav
real(rprec), dimension(:,:), allocatable greenp
real(rprec), dimension(:), allocatable grpmn_m_map_wrt
real(rprec), dimension(:), allocatable bexni
real(rprec), dimension(:), allocatable amatsav
real(rprec), dimension(:), allocatable grpmn
real(rprec), dimension(:), allocatable gstore
real(rprec), dimension(:), allocatable grpmn_n_map_wrt
real(rprec), dimension(:,:), allocatable green
real(rprec), dimension(:), allocatable amatrix
integer num_eqsolve_retries
subroutine scalpot(bvec, amatrix, wint, ivacskip, lasym, m_map, n_map)
Compute all required terms for solving for the scalar magnetic potential.