1! { dg-do compile }
2! { dg-options "-std=legacy" }
3!
4! Tests patch for PR29373, in which the implicit character
5! statement messes up the function declaration because the
6! requisite functions in decl.c were told nothing about
7! implicit types.
8!
9! Contributed by Tobias Schlueter  <tobi@gcc.gnu.org>
10!
11  implicit character*32 (a-z)
12  CHARACTER(len=255), DIMENSION(1,2)  :: a
13
14! Reporters original, which triggers another error:
15! gfc_todo: Not Implemented: complex character array
16! constructors.=> PR29431
17!  a = reshape((/ to_string(1.0) /), (/ 1, 2 /))
18
19  a = to_string(1.0)
20  print *, a
21  CONTAINS
22    CHARACTER*(32) FUNCTION to_string(x)
23      REAL, INTENT(in) :: x
24      WRITE(to_string, FMT="(F6.3)") x
25    END FUNCTION
26END PROGRAM
27