OpenCores
URL https://opencores.org/ocsvn/openrisc/openrisc/trunk

Subversion Repositories openrisc

[/] [openrisc/] [tags/] [gnu-src/] [gcc-4.5.1/] [gcc-4.5.1-or32-1.0rc2/] [gcc/] [testsuite/] [gfortran.dg/] [generic_13.f90] - Diff between revs 302 and 384

Only display areas with differences | Details | Blame | View Log

Rev 302 Rev 384
! { dg-do compile }
! { dg-do compile }
! tests the patch for PR30870, in which the generic XX was rejected
! tests the patch for PR30870, in which the generic XX was rejected
! because the specific with the same name was not looked for.
! because the specific with the same name was not looked for.
!
!
! Contributed by Joost VandeVondele 
! Contributed by Joost VandeVondele 
!
!
MODULE TEST
MODULE TEST
 INTERFACE xx
 INTERFACE xx
   MODULE PROCEDURE xx
   MODULE PROCEDURE xx
 END INTERFACE
 END INTERFACE
 public :: xx
 public :: xx
CONTAINS
CONTAINS
 SUBROUTINE xx(i)
 SUBROUTINE xx(i)
  INTEGER :: I
  INTEGER :: I
  I=7
  I=7
 END SUBROUTINE
 END SUBROUTINE
END
END
MODULE TOO
MODULE TOO
CONTAINS
CONTAINS
 SUBROUTINE SUB(xx,I)
 SUBROUTINE SUB(xx,I)
  INTERFACE
  INTERFACE
    SUBROUTINE XX(I)
    SUBROUTINE XX(I)
        INTEGER :: I
        INTEGER :: I
    END SUBROUTINE
    END SUBROUTINE
  END INTERFACE
  END INTERFACE
  CALL XX(I)
  CALL XX(I)
 END SUBROUTINE
 END SUBROUTINE
END MODULE TOO
END MODULE TOO
PROGRAM TT
PROGRAM TT
 USE TEST
 USE TEST
 USE TOO
 USE TOO
 INTEGER :: I
 INTEGER :: I
 CALL SUB(xx,I)
 CALL SUB(xx,I)
 IF (I.NE.7) CALL ABORT()
 IF (I.NE.7) CALL ABORT()
END PROGRAM
END PROGRAM
! { dg-final { cleanup-modules "test too" } }
! { dg-final { cleanup-modules "test too" } }
 
 

powered by: WebSVN 2.1.0

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