PR inline-asm/84742
[official-gcc.git] / gcc / testsuite / gfortran.dg / realloc_on_assign_8.f90
blob4f7d28895b5bc262689690ffdad96cacb2423829
1 ! { dg-do compile }
3 ! PR fortran/51448
5 ! Contribued by François Willot
7 PROGRAM MAIN
8 IMPLICIT NONE
9 TYPE mytype
10 REAL b(2)
11 END TYPE mytype
12 TYPE(mytype) a
13 DOUBLE PRECISION, ALLOCATABLE :: x(:)
14 ALLOCATE(x(2))
15 a%b=0.0E0
16 x=a%b
17 END