1!
2! Copyright (C) 2014 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_scf_energy(plugin_etot,rhoin)
10!----------------------------------------------------------------------------
11! This routine is used to calculate plugin energy related quantities
12! that needs to be solved inside the scf cycle
13!
14USE io_global,        ONLY : stdout, ionode
15USE kinds,            ONLY : DP
16USE io_files,         ONLY : tmp_dir
17!
18USE fft_base,         ONLY : dfftp
19USE lsda_mod,         ONLY : nspin
20USE scf,              ONLY : scf_type
21!
22USE plugin_flags
23!
24! ***Environ MODULES BEGIN***
25! ***Environ MODULES END***
26!
27IMPLICIT NONE
28!
29real(DP), intent(inout) :: plugin_etot
30type(scf_type), intent(in) :: rhoin
31!
32! ***Environ VARIABLES BEGIN***
33! ***Environ VARIABLES END***
34!
35! ***Environ CALLS BEGIN***
36! ***Environ CALLS END***
37!
38END SUBROUTINE plugin_scf_energy
39