2016-11-09 Paul Thomas <pault@gcc.gnu.org>
[official-gcc.git] / gcc / testsuite / gfortran.dg / move_alloc_18.f90
blobbc72d5d1f87e7d6d7b948c5871678e87536e3bc5
1 ! { dg-do compile }
3 ! Test that the anti-aliasing restriction does not knock out valid code.
5 ! Contributed by Andrew Balwin on
6 ! https://groups.google.com/forum/#!topic/comp.lang.fortran/oiXdl1LPb_s
8 PROGRAM TEST
9 IMPLICIT NONE
11 TYPE FOOBAR
12 INTEGER, ALLOCATABLE :: COMP(:)
13 END TYPE
15 TYPE (FOOBAR) :: MY_ARRAY(6)
17 ALLOCATE (MY_ARRAY(1)%COMP(10))
19 CALL MOVE_ALLOC (MY_ARRAY(1)%COMP, MY_ARRAY(2)%COMP)
21 END PROGRAM TEST