aboutsummaryrefslogtreecommitdiffstats
path: root/gcc-4.9/gcc/testsuite/gfortran.dg/automatic_default_init_1.f90
blob: 178706a3422435337c26abee5850991db894cfee (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
! { dg-do run }
! { dg-options "-O" }
! Test the fix for PR29394 in which automatic arrays did not
! get default initialization.
! Contributed by Francois-Xavier Coudert  <fxcoudert@gcc.gnu.org> 
!
MODULE M1
  TYPE T1 
    INTEGER :: I=7 
  END TYPE T1 
CONTAINS 
  SUBROUTINE S1(I) 
    INTEGER, INTENT(IN) :: I 
    TYPE(T1) :: D(1:I)
    IF (any (D(:)%I.NE.7)) CALL ABORT() 
  END SUBROUTINE S1 
END MODULE M1
  USE M1 
  CALL S1(2) 
END