6 subroutine gentauk(ik,taumt_,tauir_)
11 integer,
intent(in) :: ik
12 real(8),
intent(inout) :: taumt_(npcmtmax,natmtot,nspinor),tauir_(ngtc,nspinor)
14 integer ispn,jspn,nst,ist,jst
15 integer is,ias,nrc,nrci
16 integer npc,igk,ifg,i,nthd
21 complex(8) gzfmt(npcmtmax,3),zfmt(npcmtmax),zfft(ngtc)
23 complex(8),
allocatable :: apwalm(:,:,:,:,:),evecfv(:,:),evecsv(:,:)
24 complex(8),
allocatable :: wfmt(:,:,:,:),wfgp(:,:,:)
30 sfacgk(:,:,ispn,ik),apwalm(:,:,:,:,ispn))
43 allocate(wfmt(npcmtmax,natmtot,nspinor,nst),wfgp(
ngkmax,nspinor,nst))
44 call genwfsv(.true.,.true.,nst,idx,
ngdgc,
igfc,
ngk(:,ik),
igkig(:,:,ik),apwalm, &
45 evecfv,evecsv,wfmt,
ngkmax,wfgp)
46 deallocate(apwalm,evecfv,evecsv)
47 call holdthd(nspinor*natmtot+1,nthd)
69 wfmt(:,ias,ispn,ist),npcmtmax,gzfmt)
72 call zbsht(nrc,nrci,gzfmt(:,i),zfmt)
74 taumt_(1:npc,ias,ispn)=taumt_(1:npc,ias,ispn) &
75 +wo*(dble(zfmt(1:npc))**2+aimag(zfmt(1:npc))**2)
94 zfft(ifg)=
vgkc(i,igk,jspn,ik)*
zi*wfgp(igk,ispn,ist)
97 tauir_(1:ngtc,ispn)=tauir_(1:ngtc,ispn) &
98 +wo*(dble(zfft(1:ngtc))**2+aimag(zfft(1:ngtc))**2)
105 deallocate(wfmt,wfgp)
integer, dimension(maxspecies) npcmt
subroutine getevecsv(fext, ikp, vpl, evecsv)
subroutine genwfsv(tsh, tgp, nst, idx, ngridg_, igfft_, ngp, igpig, apwalm, evecfv, evecsv, wfmt, ld, wfir)
subroutine getevecfv(fext, ikp, vpl, vgpl, evecfv)
subroutine match(ngp, vgpc, gpc, sfacgp, apwalm)
subroutine gentauk(ik, taumt_, tauir_)
subroutine gradzfmt(nr, nri, ri, wcr, zfmt, ld, gzfmt)
complex(8), dimension(:,:,:,:), allocatable sfacgk
integer, dimension(:,:), allocatable ngk
subroutine zfftifc(nd, n, sgn, z)
real(8), dimension(:), allocatable wkpt
real(8), dimension(:,:,:,:), allocatable vgkl
integer, dimension(:), allocatable igfc
real(8), dimension(:,:,:), allocatable rlcmt
real(8), dimension(:,:), allocatable occsv
real(8), dimension(:,:,:,:), allocatable vgkc
real(8), dimension(:,:), allocatable vkl
integer, dimension(maxatoms *maxspecies) idxis
real(8), dimension(:,:,:), allocatable wcrcmt
subroutine zbsht(nr, nri, zfmt1, zfmt2)
real(8), dimension(:,:,:), allocatable gkc
integer, dimension(3) ngdgc
subroutine holdthd(nloop, nthd)
integer, dimension(maxspecies) nrcmt
integer, dimension(maxspecies) nrcmti
integer, dimension(:,:,:), allocatable igkig
integer, dimension(2) jspnfv