diff options
Diffstat (limited to 'gcc/testsuite/gfortran.dg/array_constructor_13.f90')
-rw-r--r-- | gcc/testsuite/gfortran.dg/array_constructor_13.f90 | 26 |
1 files changed, 26 insertions, 0 deletions
diff --git a/gcc/testsuite/gfortran.dg/array_constructor_13.f90 b/gcc/testsuite/gfortran.dg/array_constructor_13.f90 new file mode 100644 index 000000000..74f3d497a --- /dev/null +++ b/gcc/testsuite/gfortran.dg/array_constructor_13.f90 @@ -0,0 +1,26 @@ +! { dg-do compile } +! { dg-options "-std=legacy" } +! +! Tests patch for PR29431, which arose from PR29373. +! +! Contributed by Tobias Schlueter <tobi@gcc.gnu.org> +! + implicit none + CHARACTER(len=6), DIMENSION(2,2) :: a + +! Reporters original triggered another error: +! gfc_todo: Not Implemented: complex character array +! constructors. + + a = reshape([to_string(1.0), trim("abcdef"), & + to_string(7.0), trim("hijklm")], & + [2, 2]) + print *, a + + CONTAINS + FUNCTION to_string(x) + character*6 to_string + REAL, INTENT(in) :: x + WRITE(to_string, FMT="(F6.3)") x + END FUNCTION +end |