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

Subversion Repositories openrisc

[/] [openrisc/] [trunk/] [gnu-old/] [gcc-4.2.2/] [gcc/] [testsuite/] [gfortran.dg/] [altreturn_5.f90] - Diff between revs 154 and 816

Go to most recent revision | Only display areas with differences | Details | Blame | View Log

Rev 154 Rev 816
! { dg-do run }
! { dg-do run }
! Tests the fix for PR31483, in which dummy argument procedures
! Tests the fix for PR31483, in which dummy argument procedures
! produced an ICE if they had an alternate return.
! produced an ICE if they had an alternate return.
!
!
! Contributed by Mathias Fröhlich 
! Contributed by Mathias Fröhlich 
      SUBROUTINE R (i, *, *)
      SUBROUTINE R (i, *, *)
      INTEGER i
      INTEGER i
      RETURN i
      RETURN i
      END
      END
      SUBROUTINE PHLOAD (READER, i, res)
      SUBROUTINE PHLOAD (READER, i, res)
      IMPLICIT NONE
      IMPLICIT NONE
      EXTERNAL         READER
      EXTERNAL         READER
      integer i
      integer i
      character(3) res
      character(3) res
      CALL READER (i, *1, *2)
      CALL READER (i, *1, *2)
 1    res = "one"
 1    res = "one"
      return
      return
 2    res = "two"
 2    res = "two"
      return
      return
      END
      END
      EXTERNAL R
      EXTERNAL R
      character(3) res
      character(3) res
      call PHLOAD (R, 1, res)
      call PHLOAD (R, 1, res)
      if (res .ne. "one") call abort ()
      if (res .ne. "one") call abort ()
      CALL PHLOAD (R, 2, res)
      CALL PHLOAD (R, 2, res)
      if (res .ne. "two") call abort ()
      if (res .ne. "two") call abort ()
 
 

powered by: WebSVN 2.1.0

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