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

Subversion Repositories openrisc

[/] [openrisc/] [trunk/] [gnu-old/] [gcc-4.2.2/] [gcc/] [testsuite/] [gfortran.dg/] [used_types_1.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 }
! This checks that the fix for PR25730, which was a regression
! This checks that the fix for PR25730, which was a regression
! caused by the fix for PR19362.
! caused by the fix for PR19362.
!
!
! Contributed by Andrea Bedini 
! Contributed by Andrea Bedini 
!==============
!==============
MODULE testcase
MODULE testcase
  TYPE orbit_elem
  TYPE orbit_elem
     CHARACTER(4) :: coo
     CHARACTER(4) :: coo
  END TYPE orbit_elem
  END TYPE orbit_elem
END MODULE
END MODULE
MODULE tp_trace
MODULE tp_trace
  USE testcase
  USE testcase
  TYPE(orbit_elem) :: tp_store
  TYPE(orbit_elem) :: tp_store
CONTAINS
CONTAINS
  SUBROUTINE str_clan()
  SUBROUTINE str_clan()
    USE testcase
    USE testcase
    TYPE(orbit_elem) :: mtpcar
    TYPE(orbit_elem) :: mtpcar
    mtpcar%coo='a'             !ICE was here
    mtpcar%coo='a'             !ICE was here
  END SUBROUTINE str_clan
  END SUBROUTINE str_clan
END MODULE
END MODULE
! { dg-final { cleanup-modules "testcase tp_trace" } }
! { dg-final { cleanup-modules "testcase tp_trace" } }
 
 

powered by: WebSVN 2.1.0

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