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/] [automatic_default_init_1.f90] - Diff between revs 149 and 154

Only display areas with differences | Details | Blame | View Log

Rev 149 Rev 154
! { dg-do run }
! { dg-do run }
! { dg-options "-O" }
! { dg-options "-O" }
! Test the fix for PR29394 in which automatic arrays did not
! Test the fix for PR29394 in which automatic arrays did not
! get default initialization.
! get default initialization.
! Contributed by Francois-Xavier Coudert  
! Contributed by Francois-Xavier Coudert  
!
!
MODULE M1
MODULE M1
  TYPE T1
  TYPE T1
    INTEGER :: I=7
    INTEGER :: I=7
  END TYPE T1
  END TYPE T1
CONTAINS
CONTAINS
  SUBROUTINE S1(I)
  SUBROUTINE S1(I)
    INTEGER, INTENT(IN) :: I
    INTEGER, INTENT(IN) :: I
    TYPE(T1) :: D(1:I)
    TYPE(T1) :: D(1:I)
    IF (any (D(:)%I.NE.7)) CALL ABORT()
    IF (any (D(:)%I.NE.7)) CALL ABORT()
  END SUBROUTINE S1
  END SUBROUTINE S1
END MODULE M1
END MODULE M1
  USE M1
  USE M1
  CALL S1(2)
  CALL S1(2)
END
END
! { dg-final { cleanup-modules "m1" } }
! { dg-final { cleanup-modules "m1" } }
 
 

powered by: WebSVN 2.1.0

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