6 subroutine wfmtsv(tsh,lrstp,is,ias,nst,idx,ngp,apwalm,evecfv,evecsv,ld,wfmt)
11 logical,
intent(in) :: tsh
12 integer,
intent(in) :: lrstp,is,ias,nst,idx(*),ngp(nspnfv)
13 complex(8),
intent(in) :: apwalm(ngkmax,apwordmax,lmmaxapw,natmtot,nspnfv)
14 complex(8),
intent(in) :: evecfv(nmatmax,nstfv,nspnfv),evecsv(nstsv,nstsv)
15 integer,
intent(in) :: ld
16 complex(8),
intent(out) :: wfmt(ld,nspinor,nst)
19 integer io,ilo,ispn,jspn
20 integer nr,nri,nro,iro
22 integer n,p,i,j,k,nthd
25 complex(8) x(nstfv,nspnfv),y(nlmwf(is),nspinor,nst)
27 complex(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) <
epswf) 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) <
epswf) cycle
159 if (
ssdph) z=z*zq(ispn)
167 if (.not.tsh)
call zbshtip(nr,nri,wfmt(:,ispn,j))
176 pure subroutine zfzrf(n,z,rf,ld,zf)
179 integer,
intent(in) :: n
180 complex(8),
intent(in) :: z
181 real(8),
intent(in) :: rf(lrstp,n)
182 integer,
intent(in) :: ld
183 complex(8),
intent(inout) :: zf(ld,n)
184 zf(1,1:n)=zf(1,1:n)+z*rf(1,1:n)
pure subroutine zfzrf(n, ld1, rf, ld2, zf)
integer, dimension(maxspecies) npcmt
integer, dimension(maxspecies) nlorb
integer, dimension(:,:,:), allocatable idxlo
real(8), dimension(:,:,:,:), allocatable lofr
integer, dimension(maxspecies) npmt
complex(8), dimension(:), allocatable zqss
subroutine zbshtip(nr, nri, zfmt)
integer, dimension(0:maxlapw, maxspecies) apword
integer, dimension(maxspecies) npcmti
subroutine holdthd(nloop, nthd)
real(8), dimension(:,:,:,:,:), allocatable apwfr
integer, dimension(maxspecies) nrcmt
integer, dimension(maxspecies) nrcmti
integer, dimension(maxspecies) npmti
integer, dimension(maxlorb, maxspecies) lorbl
subroutine wfmtsv(tsh, lrstp, is, ias, nst, idx, ngp, apwalm, evecfv, evecsv, ld, wfmt)
integer, dimension(maxspecies) nrmti
integer, dimension(2) jspnfv
integer, dimension(maxspecies) nrmt