OpenCores
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] - Blame information for rev 154

Details | Compare with Previous | View Log

Line No. Rev Author Line
1 149 jeremybenn
! { dg-do compile }
2
! Tests the fix for PR29652, in which ambiguous interfaces were not detected
3
! with more than two specific procedures in the interface.
4
!
5
! Contributed by Daniel Franke  
6
!
7
MODULE global
8
INTERFACE iface
9
  MODULE PROCEDURE sub_a
10
  MODULE PROCEDURE sub_b ! { dg-error "Ambiguous interfaces" }
11
  MODULE PROCEDURE sub_c
12
END INTERFACE
13
CONTAINS
14
  SUBROUTINE sub_a(x)
15
    INTEGER, INTENT(in) :: x
16
    WRITE (*,*) 'A: ', x
17
  END SUBROUTINE
18
  SUBROUTINE sub_b(y)
19
    INTEGER, INTENT(in) :: y
20
    WRITE (*,*) 'B: ', y
21
  END SUBROUTINE
22
  SUBROUTINE sub_c(x, y)
23
    REAL, INTENT(in) :: x, y
24
    WRITE(*,*) x, y
25
  END SUBROUTINE
26
END MODULE
27
 
28
! { dg-final { cleanup-modules "global" } }

powered by: WebSVN 2.1.0

© copyright 1999-2024 OpenCores.org, equivalent to Oliscience, all rights reserved. OpenCores®, registered trademark.