OSDN Git Service

PR debug/43329
[pf3gnuchains/gcc-fork.git] / gcc / testsuite / gfortran.dg / nested_array_constructor_4.f90
1 ! { dg-do run }
2
3 ! PR fortran/35846
4 ! Alternate test that also produced an ICE because of a missing length.
5
6 PROGRAM test
7   IMPLICIT NONE
8   CHARACTER(LEN=2) :: x
9   INTEGER :: length
10
11   x = 'a'
12   length = LEN ( (/ TRIM(x), 'a' /) // 'c')
13
14   IF (length /= 2) THEN
15     CALL abort ()
16   END IF
17 END PROGRAM