2 ! Tests fix for PR20886 in which the passing of a generic procedure as
3 ! an actual argument was not detected.
5 ! The second module and the check that CALCULATION2 is a good actual
6 ! argument was added following the fix for PR26374.
8 ! Contributed by Joost VandeVondele <jv244@cam.ac.uk>
12 MODULE PROCEDURE C1
, C2
24 INTERFACE CALCULATION2
25 MODULE PROCEDURE CALCULATION2
, C3
28 SUBROUTINE CALCULATION2(r
)
38 CALL F(CALCULATION
) ! { dg-error "GENERIC procedure" }
40 CALL F(CALCULATION2
) ! OK because there is a same name specific, but: ! { dg-error "More actual than formal arguments" }