PR inline-asm/84742
[official-gcc.git] / gcc / testsuite / gfortran.dg / char_length_10.f90
blob07f10df9896795decca32982e8be1f7fddd1c0f8
1 ! { dg-do compile }
2 ! Checks the fix for PR33241, in which the assumed character
3 ! length of the parameter was never filled in with that of
4 ! the initializer.
6 ! Contributed by Victor Prosolin <victor.prosolin@gmail.com>
8 PROGRAM fptest
9 IMPLICIT NONE
10 CHARACTER (LEN=*), DIMENSION(1), PARAMETER :: var = 'a'
11 CALL parsef (var)
12 contains
13 SUBROUTINE parsef (Var)
14 IMPLICIT NONE
15 CHARACTER (LEN=*), DIMENSION(:), INTENT(in) :: Var
16 END SUBROUTINE parsef
17 END PROGRAM fptest