PR inline-asm/84742
[official-gcc.git] / gcc / testsuite / gfortran.dg / asynchronous_4.f90
blobca6cd6c02654bc90a3c15ba001343c5dd2b31e26
1 ! { dg-do compile }
3 ! PR 59228: ICE with assumed type and ASYNCHRONOUS
5 ! Contributed by Valery Weber <valeryweber@hotmail.com>
7 IMPLICIT NONE
9 interface
10 subroutine test(base)
11 TYPE(*), ASYNCHRONOUS :: base
12 end subroutine
13 end interface
15 CONTAINS
17 SUBROUTINE foo ( data )
18 REAL, DIMENSION( : ), ASYNCHRONOUS :: data
19 CALL test ( data ) ! { dg-error "Rank mismatch in argument" }
20 END SUBROUTINE
22 END