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

Subversion Repositories openrisc_me

[/] [openrisc/] [trunk/] [gnu-src/] [gcc-4.2.2/] [gcc/] [testsuite/] [gfortran.dg/] [module_interface_2.f90] - Diff between revs 149 and 154

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

Rev 149 Rev 154
! { dg-do compile }
! { dg-do compile }
! Tests the fix for PR29464, in which the second USE of the generic
! Tests the fix for PR29464, in which the second USE of the generic
! interface caused an error.
! interface caused an error.
!
!
! Contributed by Vivek Rao 
! Contributed by Vivek Rao 
!
!
module foo_mod
module foo_mod
  implicit none
  implicit none
  interface twice
  interface twice
     module procedure twice_real
     module procedure twice_real
  end interface twice
  end interface twice
contains
contains
  real function twice_real(x)
  real function twice_real(x)
    real :: x
    real :: x
    twice_real = 2*x
    twice_real = 2*x
  end function twice_real
  end function twice_real
end module foo_mod
end module foo_mod
  subroutine foobar ()
  subroutine foobar ()
    use foo_mod, only: twice, twice
    use foo_mod, only: twice, twice
    print *, twice (99.0)
    print *, twice (99.0)
  end subroutine foobar
  end subroutine foobar
  program xfoo
  program xfoo
  use foo_mod, only: two => twice, dbl => twice
  use foo_mod, only: two => twice, dbl => twice
  implicit none
  implicit none
  call foobar ()
  call foobar ()
  print *, two (2.3)
  print *, two (2.3)
  print *, dbl (2.3)
  print *, dbl (2.3)
end program xfoo
end program xfoo
! { dg-final { cleanup-modules "foo_mod" } }
! { dg-final { cleanup-modules "foo_mod" } }
 
 

powered by: WebSVN 2.1.0

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