aboutsummaryrefslogtreecommitdiffstats
path: root/gcc-4.9/gcc/testsuite/gfortran.fortran-torture/compile/pr30147.f90
blob: b9c1533d5d225d78a86308cfb5a0f873baf9741f (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
MODULE input_cp2k_motion
  IMPLICIT NONE
  interface
    SUBROUTINE keyword_create(variants)
      CHARACTER(len=*), DIMENSION(:), &
      INTENT(in)                   :: variants
    end subroutine
  end interface
CONTAINS
  SUBROUTINE create_neb_section()
    CALL keyword_create(variants=(/"K"/))
  END SUBROUTINE create_neb_section
END MODULE input_cp2k_motion