2 ! Tests the fix for PR29652, in which ambiguous interfaces were not detected
3 ! with more than two specific procedures in the interface.
5 ! Contributed by Daniel Franke <franke.daniel@gmail.com>
10 MODULE PROCEDURE sub_b
! { dg-error "Ambiguous interfaces" }
11 MODULE PROCEDURE sub_c
15 INTEGER, INTENT(in
) :: x
19 INTEGER, INTENT(in
) :: y
22 SUBROUTINE sub_c(x
, y
)
23 REAL, INTENT(in
) :: x
, y
28 ! { dg-final { cleanup-modules "global" } }