aboutsummaryrefslogtreecommitdiffstats
path: root/gcc-4.4.3/libgomp/testsuite/libgomp.fortran/pr27916-2.f90
diff options
context:
space:
mode:
Diffstat (limited to 'gcc-4.4.3/libgomp/testsuite/libgomp.fortran/pr27916-2.f90')
-rw-r--r--gcc-4.4.3/libgomp/testsuite/libgomp.fortran/pr27916-2.f9026
1 files changed, 0 insertions, 26 deletions
diff --git a/gcc-4.4.3/libgomp/testsuite/libgomp.fortran/pr27916-2.f90 b/gcc-4.4.3/libgomp/testsuite/libgomp.fortran/pr27916-2.f90
deleted file mode 100644
index aa8bb0aec..000000000
--- a/gcc-4.4.3/libgomp/testsuite/libgomp.fortran/pr27916-2.f90
+++ /dev/null
@@ -1,26 +0,0 @@
-! PR fortran/27916
-! Test whether allocatable privatized arrays has "not currently allocated"
-! status at the start of OpenMP constructs.
-! { dg-do run }
-
-program pr27916
- integer :: n, i
- logical :: r
- integer, dimension(:), allocatable :: a
-
- r = .false.
-!$omp parallel do num_threads (4) default (private) &
-!$omp & reduction (.or.: r) schedule (static)
- do n = 1, 16
- r = r .or. allocated (a)
- allocate (a (16))
- r = r .or. .not. allocated (a)
- do i = 1, 16
- a (i) = i
- end do
- deallocate (a)
- r = r .or. allocated (a)
- end do
- !$omp end parallel do
- if (r) call abort
-end program pr27916