Merge from mainline (167278:168000).
[official-gcc/graphite-test-results.git] / gcc / testsuite / gfortran.dg / initialization_10.f90
blob92d9df50eba5b61a52b4b6a6b281bf30c526a59f
1 ! { dg-do compile }
3 ! PR fortran/32867 - nested initialization expression not simplified
5 ! Testcase contributed by H. J. Lu <hjl AT lucon DOT org>
8 MODULE Readdata_mod
9 IMPLICIT NONE
10 Private
11 Public Parser
12 integer, parameter :: nkeywords = 2
13 character(80), PARAMETER, dimension(1:nkeywords) :: keywords = &
14 (/'PROBLEMSIZE ', &
15 'NFTRANS_TD '/)
17 CONTAINS
18 SUBROUTINE Parser(nx, ny, keyword)
19 integer, intent(inout) :: nx, ny
20 character(80), intent(inout) :: keyword
22 select case (keyword)
23 case (trim(keywords(1))) ! PROBLEMSIZE
24 nx = 1
25 case (trim(keywords(2))) !'NFTRANS_TD'
26 ny = 1
27 end select
29 END SUBROUTINE Parser
30 END MODULE Readdata_mod
32 ! { dg-final { cleanup-modules "Readdata_mod" } }