view gcc/testsuite/gfortran.dg/asynchronous_4.f90 @ 128:fe568345ddd5

fix CbC-example
author mir3636
date Wed, 11 Apr 2018 19:32:28 +0900
parents 04ced10e8804
children
line wrap: on
line source

! { 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