RISC-V: Regenerate opt urls.
[official-gcc.git] / gcc / testsuite / gfortran.dg / nested_array_constructor_4.f90
blob8399d7ce2b6e033dd7dc60636400cbf08874e270
1 ! { dg-do run }
3 ! PR fortran/35846
4 ! Alternate test that also produced an ICE because of a missing length.
6 PROGRAM test
7 IMPLICIT NONE
8 CHARACTER(LEN=2) :: x
9 INTEGER :: length
11 x = 'a'
12 length = LEN ( (/ TRIM(x), 'a' /) // 'c')
14 IF (length /= 2) THEN
15 STOP 1
16 END IF
17 END PROGRAM