OSDN Git Service

2006-09-07 Steven G. Kargl <kargls@comcast.net>
[pf3gnuchains/gcc-fork.git] / gcc / testsuite / gfortran.fortran-torture / compile / defined_type_2.f90
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 
17