2 ! Tests the fix for the interface bit of PR29975, in which the
3 ! interfaces bl_copy were rejected as ambiguous, even though
4 ! they import different specific interfaces.
6 ! Contributed by Joost VandeVondele <jv244@cam.ac.uk> and
7 ! simplified by Tobias Burnus <burnus@gcc.gnu.org>
9 SUBROUTINE RECOPY(N
, c
)
18 MODULE PROCEDURE SDCOPY
21 SUBROUTINE SDCOPY(N
, c
)
22 INTEGER, INTENT(IN
) :: N
26 END MODULE f77_blas_extra
28 MODULE f77_blas_generic
30 SUBROUTINE RECOPY(N
, c
)
35 END MODULE f77_blas_generic
42 if (chr
/= "sdcopy") call abort ()
43 call bl_copy(1.0, chr
)
44 if (chr
/= "recopy") call abort ()
46 ! { dg-final { cleanup-modules "f77_blas_generic f77_blas_extra" } }