re PR fortran/91390 (treatment of extra parameter in a subroutine call)
[official-gcc.git] / gcc / testsuite / gfortran.dg / used_before_typed_4.f90
blob0604cfe5638d72609f5c985a2e3b1c59055e6531
1 ! { dg-do compile }
2 ! { dg-options "-std=f95" }
4 ! Test for a special case of the used-before-typed errors, when the symbols
5 ! not-yet-typed are indices.
7 SUBROUTINE test (n, arr1, m, arr2) ! { dg-error "has no IMPLICIT type" }
8 IMPLICIT NONE
10 INTEGER :: myarr(42)
12 INTEGER :: arr1(SIZE (myarr(1:n))) ! { dg-error "'n' is used before" }
13 INTEGER :: n
15 INTEGER :: arr2(LEN ("hello"(1:m))) ! { dg-error "'m' is used before" }
16 INTEGER :: m
18 WRITE (*,*) SIZE (arr1)
19 WRITE (*,*) SIZE (arr2)
20 END SUBROUTINE test
22 PROGRAM main
23 IMPLICIT NONE
24 INTEGER :: arr1(42), arr2(42)
25 CALL test (3, arr1, 2, arr2) ! { dg-error "Type mismatch in argument" }
26 END PROGRAM main