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/] [aliasing_dummy_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 }
! This tests the fix for PR28885, in which multiple calls to a procedure
! This tests the fix for PR28885, in which multiple calls to a procedure
! with different components of an array of derived types for an INTENT(OUT)
! with different components of an array of derived types for an INTENT(OUT)
! argument caused an ICE internal compiler error.  This came about because
! argument caused an ICE internal compiler error.  This came about because
! the compiler would lose the temporary declaration with each subsequent
! the compiler would lose the temporary declaration with each subsequent
! call of the procedure.
! call of the procedure.
!
!
! Reduced from the contribution by Drew McCormack  
! Reduced from the contribution by Drew McCormack  
!
!
program test
program test
  type t
  type t
    integer :: i
    integer :: i
    integer :: j
    integer :: j
  end type
  end type
  type (t) :: a(5)
  type (t) :: a(5)
  call sub('one',a%j)
  call sub('one',a%j)
  call sub('two',a%i)
  call sub('two',a%i)
contains
contains
  subroutine sub(key,a)
  subroutine sub(key,a)
    integer, intent(out)    :: a(:)
    integer, intent(out)    :: a(:)
    character(*),intent(in) :: key
    character(*),intent(in) :: key
    a = 1
    a = 1
  end subroutine
  end subroutine
end program
end program
 
 

powered by: WebSVN 2.1.0

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