URL
https://opencores.org/ocsvn/openrisc_2011-10-31/openrisc_2011-10-31/trunk
Subversion Repositories openrisc_2011-10-31
[/] [openrisc/] [trunk/] [gnu-src/] [gcc-4.2.2/] [gcc/] [testsuite/] [gfortran.dg/] [generic_7.f90] - Rev 165
Go to most recent revision | Compare with Previous | Blame | View Log
! { dg-do compile }
! Tests the fix for PR29652, in which ambiguous interfaces were not detected
! with more than two specific procedures in the interface.
!
! Contributed by Daniel Franke <franke.daniel@gmail.com>
!
MODULE global
INTERFACE iface
MODULE PROCEDURE sub_a
MODULE PROCEDURE sub_b ! { dg-error "Ambiguous interfaces" }
MODULE PROCEDURE sub_c
END INTERFACE
CONTAINS
SUBROUTINE sub_a(x)
INTEGER, INTENT(in) :: x
WRITE (*,*) 'A: ', x
END SUBROUTINE
SUBROUTINE sub_b(y)
INTEGER, INTENT(in) :: y
WRITE (*,*) 'B: ', y
END SUBROUTINE
SUBROUTINE sub_c(x, y)
REAL, INTENT(in) :: x, y
WRITE(*,*) x, y
END SUBROUTINE
END MODULE
! { dg-final { cleanup-modules "global" } }
Go to most recent revision | Compare with Previous | Blame | View Log