14SUBROUTINE analyt(grpmn, bvec, ivacskip, lasym, m_map, n_map, grpmn_m_map, grpmn_n_map)
20 INTEGER,
INTENT(in) :: ivacskip
21 REAL(rprec),
INTENT(out) :: grpmn(nuv2*mnpd2)
22 REAL(rprec),
INTENT(out) :: bvec(mnpd2)
23 real(rprec),
intent(out) :: m_map(mnpd2)
24 real(rprec),
intent(out) :: n_map(mnpd2)
25 real(rprec),
intent(out) :: grpmn_m_map(nuv2*mnpd2)
26 real(rprec),
intent(out) :: grpmn_n_map(nuv2*mnpd2)
27 integer,
intent(in) :: lasym
30 REAL(rprec) :: fl, fl1, sign1
83 IF (ivacskip .eq. 0)
THEN
115 lloop:
DO l = 0, mf + nf
125 IF (ivacskip .eq. 0)
THEN
142 IF (n.eq.0 .or. m.eq.0)
THEN
144 CALL analysum (grpmn, bvec,
slpm,
tlpm, m, n, l, ivacskip, lasym, m_map, n_map, &
145 grpmn_m_map, grpmn_n_map)
148 CALL analysum2 (grpmn, bvec, m, n, l, ivacskip, lasym, m_map, n_map, &
149 grpmn_m_map, grpmn_n_map)
173 call add_real_3d(
"all_tlp", mf+nf+1, nv, nu3,
all_tlp)
174 call add_real_3d(
"all_tlm", mf+nf+1, nv, nu3,
all_tlm)
175 call add_real_2d(
"bvec", mf1, nf1, bvec)
177 if (ivacskip .eq. 0)
then
178 call add_real_3d(
"all_slp", mf+nf+1, nv, nu3,
all_slp)
179 call add_real_3d(
"all_slm", mf+nf+1, nv, nu3,
all_slm)
180 call add_real_4d(
"grpmn", mf1, nf1, nv, nu3, grpmn)
182 call add_null(
"all_slp")
183 call add_null(
"all_slm")
184 call add_null(
"grpmn")
subroutine analysum2(grpmn, bvec, m, n, l, ivacskip, lasym, m_map, n_map, grpmn_m_map, grpmn_n_map)
Compute the (m>0 and n>0) part of the DFT of the analytical Fourier transforms of the equivalently-si...
subroutine analysum(grpmn, bvec, sl, tl, m, n, l, ivacskip, lasym, m_map, n_map, grpmn_m_map, grpmn_n_map)
Compute the (m=0 or n=0) part of the DFT of the analytical Fourier transforms of the equivalently-sin...
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.
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 tlm2
real(rprec), dimension(:,:), allocatable all_slp
real(rprec), dimension(:,:), allocatable all_tlp
real(rprec), dimension(:), allocatable auu
real(rprec), dimension(:), allocatable cma
real(rprec), dimension(:), allocatable r0m
real(rprec), dimension(:), allocatable sqad1u
real(rprec), dimension(:), allocatable tlp
real(rprec), dimension(:), allocatable r1p
real(rprec), dimension(:), allocatable azp1u
real(rprec), dimension(:), allocatable tlp1
real(rprec), dimension(:), allocatable grpmn
real(rprec), dimension(:), allocatable ra1m
real(rprec), dimension(:), allocatable slpm
real(rprec), dimension(:), allocatable sqad2u
real(rprec), dimension(:), allocatable adm
real(rprec), dimension(:,:), allocatable all_tlm
real(rprec), dimension(:), allocatable sqrtc
real(rprec), dimension(:), allocatable tlm1
real(rprec), dimension(:), allocatable r1m
real(rprec), dimension(:), allocatable cma11u
real(rprec), dimension(:), allocatable slp
real(rprec), dimension(:), allocatable sqrta
real(rprec), dimension(:), allocatable azm1u
real(rprec), dimension(:), allocatable tlp2
real(rprec), dimension(:), allocatable guu_b
real(rprec), dimension(:,:), allocatable all_slm
real(rprec), parameter two
real(rprec), dimension(:), allocatable adp
real(rprec), dimension(:), allocatable tlm
real(rprec), dimension(:), allocatable auv
real(rprec), dimension(:), allocatable avv
real(rprec), dimension(:), allocatable gvv_b
real(rprec), dimension(:), allocatable delt1u
real(rprec), dimension(:), allocatable guv_b
real(rprec), dimension(:), allocatable r0p
real(rprec), dimension(:), allocatable tlpm
real(rprec), dimension(:), allocatable ra1p
real(rprec), dimension(:), allocatable slm
integer num_eqsolve_retries