PR tree-optimization/86415 - strlen() not folded for substrings within constant arrays
[official-gcc.git] / gcc / testsuite / gfortran.dg / array_constructor_type_1.f03
blob07ecbccfa3d93d3cf983efb1799e4dc788b2a279
1 ! { dg-do run }
3 ! PR fortran/27997
5 ! Simple array constructor with typespec.
7 PROGRAM test
8   IMPLICIT NONE
9   INTEGER :: array(5)
11   array = (/ INTEGER :: 18, 12, 31, 3, 42.4 /)
13   IF (array(1) /= 18 .OR. array(2) /= 12 .OR. &
14       array(3) /= 31 .OR. array(4) /=  3 .OR. array(5) /= 42) THEN
15       STOP 1
16   END IF
17 END PROGRAM test