6subroutine wfmtsv(tsh,lrstp,is,ias,nst,idx,ngp,apwalm,evecfv,evecsv,ld,wfmt)
11logical,
intent(in) :: tsh
12integer,
intent(in) :: lrstp,is,ias,nst,idx(*),ngp(nspnfv)
13complex(8),
intent(in) :: apwalm(ngkmax,apwordmax,lmmaxapw,natmtot,nspnfv)
14complex(8),
intent(in) :: evecfv(nmatmax,nstfv,nspnfv),evecsv(nstsv,nstsv)
15integer,
intent(in) :: ld
16complex(8),
intent(out) :: wfmt(ld,nspinor,nst)
19integer io,ilo,ispn,jspn
25complex(8) x(nstfv,nspnfv),y(nlmwf(is),nspinor,nst)
27complex(8),
external :: zdotu
66 x(j,jspn)=zdotu(n,evecfv(:,j,jspn),1,apwalm(:,io,lm,ias,jspn),1)
74 if (tasv) then; k=j; else; k=idx(j);
end if
75 y(p,1,j)=zdotu(nstfv,evecsv(1,k),1,x,1)
78 y(p,2,j)=zdotu(nstfv,evecsv(nstfv+1,k),1,x(1,jspn),1)
85 if (tasv) then; k=j; else; k=idx(j);
end if
86 y(p,1,j)=zdotu(ngp(1),evecfv(:,k,1),1,apwalm(:,io,lm,ias,1),1)
95 wfmt(1:np,1:nspinor,j)=0.d0
104 if (abs(z%re)+abs(z%im) < 1.d-12) cycle
105 if (
ssdph) z=z*zq(ispn)
107 call zfzrf(nri,z,
apwfr(1,1,io,l,ias),
lmmaxi,wfmt(lm,ispn,j))
109 call zfzrf(nro,z,
apwfr(iro,1,io,l,ias),
lmmaxo,wfmt(i,ispn,j))
122 do lm=l**2+1,(l+1)**2
128 x(1:nstfv,jspn)=evecfv(n+i,1:nstfv,jspn)
132 if (tasv) then; k=j; else; k=idx(j);
end if
133 y(p,1,j)=zdotu(nstfv,evecsv(1,k),1,x,1)
136 y(p,2,j)=zdotu(nstfv,evecsv(nstfv+1,k),1,x(1,jspn),1)
142 if (tasv) then; k=j; else; k=idx(j);
end if
143 y(p,1,j)=evecfv(ngp(1)+i,k,1)
154 do lm=l**2+1,(l+1)**2
158 if (abs(z%re)+abs(z%im) < 1.d-12) cycle
159 if (
ssdph) z=z*zq(ispn)
167 if (.not.tsh)
call zbshtip(nr,nri,wfmt(:,ispn,j))
180integer,
intent(in) :: n
181complex(8),
intent(in) :: z
182real(8),
intent(in) :: rf(lrstp,n)
183integer,
intent(in) :: ld
184complex(8),
intent(inout) :: zf(ld,n)
185zf(1,1:n)=zf(1,1:n)+z*rf(1,1:n)
integer, dimension(maxspecies) nrmti
complex(8), dimension(:), allocatable zqss
integer, dimension(maxspecies) nrmt
integer, dimension(:,:,:), allocatable idxlo
integer, dimension(maxspecies) npcmti
integer, dimension(maxspecies) npmti
integer, dimension(maxspecies) nrcmt
integer, dimension(0:maxlapw, maxspecies) apword
integer, dimension(maxspecies) npcmt
real(8), dimension(:,:,:,:,:), allocatable apwfr
integer, dimension(maxspecies) npmt
integer, dimension(2) jspnfv
integer, dimension(maxspecies) nlorb
integer, dimension(maxspecies) nrcmti
real(8), dimension(:,:,:,:), allocatable lofr
integer, dimension(maxlorb, maxspecies) lorbl
subroutine wfmtsv(tsh, lrstp, is, ias, nst, idx, ngp, apwalm, evecfv, evecsv, ld, wfmt)