3 ! Check for constraints restricting arguments of ELEMENTAL procedures.
5 ! Contributed by Daniel Kraft, d@domob.eu.
12 IMPURE ELEMENTAL
SUBROUTINE foobar
&
13 (a
, & ! { dg-error "must be scalar" }
14 b
, & ! { dg-error "POINTER attribute" }
15 c
, & ! { dg-error "ALLOCATABLE attribute" }
16 d
) ! { dg-error "must have its INTENT specified or have the VALUE attribute" }
17 INTEGER, INTENT(IN
) :: a(:)
18 INTEGER, POINTER, INTENT(IN
) :: b
19 INTEGER, ALLOCATABLE
, INTENT(IN
) :: c