2011-05-23 Tom de Vries <tom@codesourcery.com>
[official-gcc.git] / gcc / testsuite / gfortran.dg / coarray_21.f90
blob8aa0aa6c5a664185b46ba1bc46328fd9c9678821
1 ! { dg-do compile }
2 ! { dg-options "-fcoarray=single" }
4 ! PR fortran/18918
6 ! Before scalar coarrays weren't regarded as scalar in the ME.
8 module mod_reduction
9 real :: g[*]
10 contains
11 subroutine caf_reduce(x)
12 real, intent(in) :: x
13 g = x ! << used to ICE
14 end
15 end module
17 program test
18 integer, parameter :: size = 4000
19 type :: pct
20 integer, allocatable :: data(:,:)
21 end type
22 type(pct) :: picture[*]
23 allocate(picture%data(size, size))
24 end program test
27 ! { dg-final { cleanup-modules "mod_reduction" } }