aboutsummaryrefslogtreecommitdiffstats
path: root/gcc-4.9/gcc/testsuite/gfortran.dg/asynchronous_4.f90
blob: ca6cd6c02654bc90a3c15ba001343c5dd2b31e26 (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
! { dg-do compile }
!
! PR 59228: ICE with assumed type and ASYNCHRONOUS
!
! Contributed by Valery Weber <valeryweber@hotmail.com>

  IMPLICIT NONE

  interface
     subroutine test(base)
       TYPE(*), ASYNCHRONOUS :: base
     end subroutine
  end interface

CONTAINS

  SUBROUTINE foo ( data )
    REAL, DIMENSION( : ), ASYNCHRONOUS :: data
    CALL test ( data )                ! { dg-error "Rank mismatch in argument" }
  END SUBROUTINE

END