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_int_forces(force)
10!----------------------------------------------------------------------------
11!
12USE kinds,             ONLY : DP
13USE io_global,         ONLY : stdout
14USE ions_base,         ONLY : nat, ityp
15USE cell_base,         ONLY : omega
16USE fft_base,          ONLY : dfftp
17USE fft_interfaces,    ONLY : fwfft
18USE electrons_base,    ONLY : nspin
19USE gvect,             ONLY : eigts1, eigts2, eigts3
20!
21USE plugin_flags
22!
23! ***Environ MODULES BEGIN***
24! ***Environ MODULES END***
25!
26IMPLICIT NONE
27!
28REAL(DP), INTENT(INOUT) :: force(3,nat)
29!
30! aux is used to store a possible additional density
31! now defined in real space
32!
33COMPLEX(DP), ALLOCATABLE :: auxg(:), auxr(:)
34!
35INTEGER  :: ipol, na
36! counter on polarization
37! counter on atoms
38!
39! ***Environ VARIABLES BEGIN***
40! ***Environ VARIABLES END***
41!
42! ***Environ CALLS BEGIN***
43! ***Environ CALLS END***
44!
45END SUBROUTINE plugin_int_forces
46