2018-01-22 Sebastian Perta <sebastian.perta@renesas.com>
[official-gcc.git] / libgomp / testsuite / libgomp.fortran / pr27916-1.f90
blob7f6b51d0892d4519e32581ef4a65cf8c69c9c32d
1 ! PR fortran/27916
2 ! Test whether allocatable privatized arrays has "not currently allocated"
3 ! status at the start of OpenMP constructs.
4 ! { dg-do run }
6 program pr27916
7 integer :: n, i
8 logical :: r
9 integer, dimension(:), allocatable :: a
11 r = .false.
12 !$omp parallel do num_threads (4) private (n, a, i) &
13 !$omp & reduction (.or.: r) schedule (static)
14 do n = 1, 16
15 r = r .or. allocated (a)
16 allocate (a (16))
17 r = r .or. .not. allocated (a)
18 do i = 1, 16
19 a (i) = i
20 end do
21 deallocate (a)
22 r = r .or. allocated (a)
23 end do
24 !$omp end parallel do
25 if (r) call abort
26 end program pr27916