PR rtl-optimization/82913
[official-gcc.git] / gcc / testsuite / gfortran.fortran-torture / compile / pr30147.f90
blobb9c1533d5d225d78a86308cfb5a0f873baf9741f
1 MODULE input_cp2k_motion
2 IMPLICIT NONE
3 interface
4 SUBROUTINE keyword_create(variants)
5 CHARACTER(len=*), DIMENSION(:), &
6 INTENT(in) :: variants
7 end subroutine
8 end interface
9 CONTAINS
10 SUBROUTINE create_neb_section()
11 CALL keyword_create(variants=(/"K"/))
12 END SUBROUTINE create_neb_section
13 END MODULE input_cp2k_motion