more strictly follow the Fortran 2003 standard requirements
This commit is contained in:
@ -110,7 +110,7 @@ FUNCTION f_lammps_gather_atoms_subset_mask(i) BIND(C)
|
||||
INTEGER(c_int) :: f_lammps_gather_atoms_subset_mask
|
||||
INTEGER(c_int), DIMENSION(:), ALLOCATABLE :: mask
|
||||
INTEGER :: j
|
||||
INTEGER(c_int), DIMENSION(*), PARAMETER :: tag = [3,2]
|
||||
INTEGER(c_int), DIMENSION(2), PARAMETER :: tag = [3,2]
|
||||
|
||||
CALL lmp%gather_atoms_subset('mask', 1_c_int, tag, mask)
|
||||
f_lammps_gather_atoms_subset_mask = -1
|
||||
@ -130,7 +130,7 @@ FUNCTION f_lammps_gather_atoms_subset_position(xyz,id) BIND(C)
|
||||
INTEGER(c_int), INTENT(IN), VALUE :: id, xyz
|
||||
REAL(c_double) :: f_lammps_gather_atoms_subset_position
|
||||
REAL(c_double), DIMENSION(:), ALLOCATABLE :: positions
|
||||
INTEGER(c_int), DIMENSION(*), PARAMETER :: tag = [3,2]
|
||||
INTEGER(c_int), DIMENSION(2), PARAMETER :: tag = [3,2]
|
||||
INTEGER :: j
|
||||
|
||||
CALL lmp%gather_atoms_subset('x', 3_c_int, tag, positions)
|
||||
@ -189,7 +189,7 @@ SUBROUTINE f_lammps_scatter_atoms_subset_mask() BIND(C)
|
||||
USE keepstuff, ONLY : lmp
|
||||
IMPLICIT NONE
|
||||
INTEGER(c_int), DIMENSION(:), ALLOCATABLE :: all_masks
|
||||
INTEGER(c_int), DIMENSION(*), PARAMETER :: tags = [3,1]
|
||||
INTEGER(c_int), DIMENSION(2), PARAMETER :: tags = [3,1]
|
||||
INTEGER(c_int), DIMENSION(2) :: masks
|
||||
|
||||
CALL lmp%gather_atoms('mask', 1_c_int, all_masks)
|
||||
|
||||
Reference in New Issue
Block a user