! ! Copyright (C) 2001-2008 Quantum ESPRESSO group ! This file is distributed under the terms of the ! GNU General Public License. See the file `License' ! in the root directory of the present distribution, ! or http://www.gnu.org/copyleft/gpl.txt . ! ! !---------------------------------------------------------------------- subroutine newdq (dvscf, npe) !---------------------------------------------------------------------- ! ! This routine computes the contribution of the selfconsistent ! change of the potential to the known part of the linear ! system and adds it to dvpsi. ! ! USE kinds, ONLY : DP USE ions_base, ONLY : nat, ityp, ntyp => nsp USE noncollin_module, ONLY : noncolin, nspin_mag USE cell_base, ONLY : omega USE gvect, ONLY : nr1, nr2, nr3, nrx1, nrx2, nrx3, & nrxx, g, gg, ngm, ig1, ig2, ig3, & eigts1, eigts2, eigts3, nl USE uspp, ONLY: okvan USE uspp_param, ONLY : upf, lmaxq, nh, nhm USE paw_variables, ONLY : okpaw USE gwus, ONLY : int3, int3_paw USE qpoint, ONLY : xq, eigqts USE control_gw, ONLY : lgamma USE mp_global, ONLY: intra_pool_comm USE mp, ONLY: mp_sum implicit none ! ! The dummy variables ! integer :: npe ! input: the number of perturbations !HL !complex(DP) :: dvscf (nrxx, nspin_mag, npe) complex(DP) :: dvscf (nrxx, nspin_mag) ! input: the change of the self ! consistent pot. ! And the local variables integer :: na, ig, nt, ir, ipert, is, ih, jh ! countera real(DP), allocatable :: qmod (:), qg (:,:), ylmk0 (:,:) ! the modulus of q+G ! the values of q+G ! the spherical harmonics complex(DP), external :: zdotc ! the scalar product function complex(DP), allocatable :: aux1 (:), aux2 (:,:), veff (:), qgm(:) ! work space if (.not.okvan) return call start_clock ('newdq') int3 (:,:,:,:,:) = (0.d0, 0.0d0) allocate (aux1 (ngm)) allocate (aux2 (ngm , nspin_mag)) allocate (veff (nrxx)) allocate (ylmk0(ngm , lmaxq * lmaxq)) allocate (qgm (ngm)) allocate (qmod (ngm)) if (.not.lgamma) allocate (qg (3, ngm)) ! ! first compute the spherical harmonics ! if (.not.lgamma) then call setqmod (ngm, xq, g, qmod, qg) call ylmr2 (lmaxq * lmaxq, ngm, qg, qmod, ylmk0) do ig = 1, ngm qmod (ig) = sqrt (qmod (ig) ) enddo else call ylmr2 (lmaxq * lmaxq, ngm, g, gg, ylmk0) do ig = 1, ngm qmod (ig) = sqrt (gg (ig) ) enddo endif ! ! and for each perturbation of this irreducible representation ! integrate the change of the self consistent potential and ! the Q functions ! ! HL ! do ipert = 1, npe ipert = 1 do is = 1, nspin_mag do ir = 1, nrxx veff (ir) = dvscf (ir, is) enddo call cft3 (veff, nr1, nr2, nr3, nrx1, nrx2, nrx3, - 1) do ig = 1, ngm aux2 (ig, is) = veff (nl (ig) ) enddo enddo do nt = 1, ntyp if (upf(nt)%tvanp ) then do ih = 1, nh (nt) do jh = ih, nh (nt) call qvan2 (ngm, ih, jh, nt, qmod, qgm, ylmk0) do na = 1, nat if (ityp (na) == nt) then do ig = 1, ngm aux1(ig) = qgm(ig) * eigts1(ig1(ig),na) * & eigts2(ig2(ig),na) * & eigts3(ig3(ig),na) * & eigqts(na) enddo do is = 1, nspin_mag int3(ih,jh,ipert,na,is) = omega * & zdotc(ngm,aux1,1,aux2(1,is),1) enddo endif enddo enddo enddo do na = 1, nat if (ityp(na) == nt) then ! ! We use the symmetry properties of the ps factor ! do ih = 1, nh (nt) do jh = ih, nh (nt) do is = 1, nspin_mag int3(jh,ih,ipert,na,is) = int3(ih,jh,ipert,na,is) enddo enddo enddo endif enddo endif enddo ! enddo !HL #ifdef __PARA call mp_sum ( int3, intra_pool_comm ) #endif !HL IF (noncolin) CALL set_int3_nc(npe) IF (okpaw) int3=int3+int3_paw if (.not.lgamma) deallocate (qg) deallocate (qmod) deallocate (qgm) deallocate (ylmk0) deallocate (veff) deallocate (aux2) deallocate (aux1) call stop_clock ('newdq') return end subroutine newdq