Remove old autovect-branch by moving to "dead" directory.
[official-gcc.git] / old-autovect-branch / gcc / testsuite / gfortran.fortran-torture / compile / defined_type_2.f90
blob29515f5561e3d3dabf96e3cd98819909d63dbe2e
1 !This used to ICE as we chose the wrong type for the
2 ! temporary to hold type%x
3 ! fortran/18157
4 MODULE bug
5 IMPLICIT NONE
6 TYPE :: my_type
7 REAL :: x
8 END TYPE
9 TYPE (my_type), DIMENSION(3) :: t
10 CONTAINS
11 SUBROUTINE foo
12 INTEGER, DIMENSION(8) :: c(3)
13 t(c)%x = t(c)%x
14 RETURN
15 END SUBROUTINE foo
16 END MODULE bug