PR inline-asm/84742
[official-gcc.git] / gcc / testsuite / gfortran.dg / coarray_allocate_6.f08
blob2fdd4c128ef5923733ef7bcccce135623ed66ca6
1 ! { dg-do run }
2 ! { dg-options "-fcoarray=single -fdump-tree-original" }
4 ! Contributed by Tobias Burnus  <burnus@gcc.gnu.org>
5 ! Test fix for pr65795.
7 implicit none
9 type t2
10   integer, allocatable :: x
11 end type t2
13 type t3
14   type(t2), allocatable :: caf[:]
15 end type t3
17 !type(t3), save, target :: c, d
18 type(t3), target :: c, d
19 integer :: stat
21 allocate(c%caf[*], stat=stat)
22 end
24 ! Besides checking that the executable does not crash anymore, check
25 ! that the cause has been remove.
26 ! { dg-final { scan-tree-dump-not "c.caf.x = 0B" "original" } }