OpenCores
URL https://opencores.org/ocsvn/openrisc_2011-10-31/openrisc_2011-10-31/trunk

Subversion Repositories openrisc_2011-10-31

[/] [openrisc/] [tags/] [gnu-src/] [gcc-4.5.1/] [gcc-4.5.1-or32-1.0rc2/] [gcc/] [testsuite/] [gfortran.dg/] [use_only_2.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 }
! Checks the fix for PR34672, in which generic interfaces were not
! Checks the fix for PR34672, in which generic interfaces were not
! being written correctly, when renamed.
! being written correctly, when renamed.
!
!
! Contributed by Jos de Kloe 
! Contributed by Jos de Kloe 
!
!
MODULE MyMod1
MODULE MyMod1
  integer, parameter :: i2_ = Selected_Int_Kind(4)
  integer, parameter :: i2_ = Selected_Int_Kind(4)
END Module MyMod1
END Module MyMod1
module MyMod2
module MyMod2
  INTERFACE write_int
  INTERFACE write_int
     module procedure write_int_local
     module procedure write_int_local
  END INTERFACE
  END INTERFACE
contains
contains
  subroutine write_int_local(value)
  subroutine write_int_local(value)
    integer, intent(in)  :: value
    integer, intent(in)  :: value
    print *,value
    print *,value
  end subroutine write_int_local
  end subroutine write_int_local
end module MyMod2
end module MyMod2
module MyMod3
module MyMod3
  USE MyMod2, only: write_MyInt   => write_int
  USE MyMod2, only: write_MyInt   => write_int
  USE MyMod1, only: i2_
  USE MyMod1, only: i2_
end module MyMod3
end module MyMod3
module MyMod4
module MyMod4
  USE MyMod3, only: write_MyInt
  USE MyMod3, only: write_MyInt
end module MYMOD4
end module MYMOD4
! { dg-final { cleanup-modules "MyMod1 MyMod2 MyMod3 MyMod4" } }
! { dg-final { cleanup-modules "MyMod1 MyMod2 MyMod3 MyMod4" } }
 
 

powered by: WebSVN 2.1.0

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