Home
last modified time | relevance | path

Searched refs:rhocg (Results 1 – 10 of 10) sorted by relevance

/dports/science/quantum-espresso/q-e-qe-6.7.0/PW/src/
H A Datomic_rho.f9041 COMPLEX(DP), INTENT(OUT) :: rhocg(ngm,nspina) local
59 call threaded_nowait_memset(rhocg, 0.0_dp, ngm*nspina*2)
104 rhocg(ig,1) = rhocg(ig,1) + &
121 rhocg(ig,is) = rhocg(ig,is) + &
169 COMPLEX(DP), allocatable :: rhocg (:,:) local
174 ALLOCATE (rhocg(dfftp%ngm, nspina))
176 CALL atomic_rho_g (rhocg, nspina)
181 CALL rho_g2r ( dfftp, rhocg, rhoa )
182 DEALLOCATE (rhocg)
H A Dstres_cc.f9038 real(DP) , allocatable:: rhocg (:), vxc (:,:) local
65 allocate(rhocg(ngl))
75 rgrid(nt)%rab, upf(nt)%rho_atc, rhocg)
78 CONJG(psic (dfftp%nl(1) ) ) * strf (1,nt) * rhocg (igtongl (1) )
81 strf (ng,nt) * rhocg (igtongl (ng) ) * fact
85 rgrid(nt)%r, rgrid(nt)%rab, upf(nt)%rho_atc, rhocg)
91 * strf (ng, nt) * rhocg (igtongl (ng) ) * tpiba * &
103 deallocate (rhocg)
H A Dset_rhoc.f9033 REAL(DP) , ALLOCATABLE :: rhocg(:) local
47 ALLOCATE (rhocg( ngl))
57 rgrid(nt)%rab, upf(nt)%rho_atc, rhocg)
62 rhog_core(ng) = rhog_core(ng) + strf(ng,nt) * rhocg(igtongl(ng))
66 DEALLOCATE (rhocg)
H A Dforce_cc.f9045 REAL(DP), ALLOCATABLE :: vxc(:,:), rhocg(:) local
86 ALLOCATE( rhocg(ngl) )
95 rgrid(nt)%rab, upf(nt)%rho_atc, rhocg )
103 rhocg(igtongl(ig)) * CONJG(psic(dfftp%nl(ig) ) ) * &
114 DEALLOCATE( rhocg )
H A Ddrhoc.f9035 REAL(DP) :: rhocg(ngl) local
63 rhocg(1) = fpi * rhocg1 / omega
80 rhocg(igl) = fpi * rhocg1 / omega
/dports/science/quantum-espresso/q-e-qe-6.7.0/PHonon/Gamma/
H A Ddynmatcc.f9035 real(DP), ALLOCATABLE:: rhocg(:), dyncc1(:,:,:,:) local
50 ALLOCATE ( rhocg( ngl))
63 rgrid(nta)%rab, upf(nta)%rho_atc, rhocg)
69 work1(ig)= rhocg(igtongl(ig))* exc * conjg(vxc(dfftp%nl(ig)))
84 dfftp%nl,igtongl,rhocg,dmuxc,gc(1,i),aux3,gc(1,i))
91 rhocg)
97 work1(ig) = exc * rhocg(igtongl(ig))
112 DEALLOCATE(rhocg)
H A Ddvpsi_kb.f9036 real(DP), POINTER :: bec1(:,:), bec2(:,:), rhocg(:), dv(:) local
43 rhocg => auxr
55 rhocg )
67 dvb_cc(dfftp%nl(ng)) = dvb_cc(dfftp%nl(ng)) + rhocg (igtongl(ng)) * exc
/dports/science/quantum-espresso/q-e-qe-6.7.0/PP/src/
H A Dadd_shift_cc.f9045 real(DP), ALLOCATABLE :: vxc (:,:), rhocg (:), shift_(:) local
82 ALLOCATE ( rhocg(ngl) )
91 rgrid(nt)%rab, upf(nt)%rho_atc, rhocg)
94 IF (gstart==2) shift_(na) = omega * rhocg (igtongl (1) ) * &
100 rhocg (igtongl (ig) ) * conjg(psic (dfftp%nl (ig) ) ) * &
111 DEALLOCATE (rhocg, shift_)
/dports/science/quantum-espresso/q-e-qe-6.7.0/CPV/src/
H A Dmodules.f90147 REAL(DP), ALLOCATABLE:: rhocg(:,:) variable
158 ALLOCATE( rhocg( ngm, nsp ) )
174 IF( ALLOCATED( rhocg ) ) DEALLOCATE( rhocg )
H A Dnlcc.f9029 USE core, ONLY : rhocb, rhocg, drhocg
62 rhocg (1,is) = rhoc1_sp(is)%y( 1 ) * cost1
65 DO ig = gstart, SIZE( rhocg, 1 )
67 rhocg (ig,is) = spline( rhoc1_sp(is), xg ) * cost1
73 CALL compute_rhocg( rhocg(:,is), drhocg(:,is), rgrid(is)%r, &