Daily bump.
[official-gcc.git] / gcc / testsuite / gfortran.dg / array_constructor_13.f90
blobbacc6fffc38f0c1aad254df1cb83da12dac79738
1 ! { dg-do compile }
2 ! Tests patch for PR29431, which arose from PR29373.
4 ! Contributed by Tobias Schlueter <tobi@gcc.gnu.org>
6 implicit none
7 CHARACTER(len=6), DIMENSION(2,2) :: a
9 ! Reporters original triggered another error:
10 ! gfc_todo: Not Implemented: complex character array
11 ! constructors.
13 a = reshape([to_string(1.0), trim("abcdef"), &
14 to_string(7.0), trim("hijklm")], &
15 [2, 2])
16 print *, a
18 CONTAINS
19 FUNCTION to_string(x)
20 character*6 to_string
21 REAL, INTENT(in) :: x
22 WRITE(to_string, FMT="(F6.3)") x
23 END FUNCTION
24 end