1!
2! Copyright (C) 2015 Quantum ESPRESSO group
3! This file is distributed under the terms of the
4! GNU General Public License. See the file `License'
5! in the root directory of the present distribution,
6! or http://www.gnu.org/copyleft/gpl.txt .
7!
8!----------------------------------------------------------------------------
9SUBROUTINE plugin_get_potential(rhoin,nfi)
10!----------------------------------------------------------------------------
11! This routine is used to calculate plugin contribution
12! to the potential acting on the electrons
13!
14USE io_global,        ONLY : stdout, ionode
15USE kinds,            ONLY : DP
16!
17USE fft_base,         ONLY : dfftp
18USE electrons_base,   ONLY : nspin
19!
20USE plugin_flags
21!
22! ***Environ MODULES BEGIN***
23! ***Environ MODULES END***
24!
25IMPLICIT NONE
26!
27REAL(DP), intent(in) :: rhoin(dfftp%nnr,nspin)
28INTEGER, intent(in) :: nfi
29!
30! ***Environ VARIABLES BEGIN***
31! ***Environ VARIABLES END***
32!
33! ***Environ CALLS BEGIN***
34! ***Environ CALLS END***
35!
36END SUBROUTINE plugin_get_potential
37