quantum-espresso/Modules/ions_base.f90

41 lines
1.3 KiB
Fortran
Raw Normal View History

!
! Copyright (C) 2002 FPMD 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 .
!
!------------------------------------------------------------------------------!
MODULE ions_base
!------------------------------------------------------------------------------!
USE kinds, ONLY: dbl
USE parameters, ONLY: nsx
!
IMPLICIT NONE
SAVE
! nsp = number of species
! na(is) = number of atoms of species is
! nax = max number of atoms of a given species
! nat = total number of atoms of all species
INTEGER :: nsp = 0
INTEGER :: na(nsx) = 0
INTEGER :: nax = 0
INTEGER :: nat = 0
! zv(is) = (pseudo-)atomic charge
! pmass(is) = mass (converted to a.u.) of ions
! rcmax(is) = Ewald radius (for ion-ion interactions)
REAL(dbl) :: zv(nsx) = 0.0d0
REAL(dbl) :: pmass(nsx) = 0.0d0
REAL(dbl) :: rcmax(nsx) = 0.0d0
!
!------------------------------------------------------------------------------!
END MODULE ions_base
!------------------------------------------------------------------------------!