aboutsummaryrefslogtreecommitdiffstats
path: root/gcc-4.2.1-5666.3/libgomp/testsuite/libgomp.fortran/appendix-a/a.19.1.f90
diff options
context:
space:
mode:
Diffstat (limited to 'gcc-4.2.1-5666.3/libgomp/testsuite/libgomp.fortran/appendix-a/a.19.1.f90')
-rw-r--r--gcc-4.2.1-5666.3/libgomp/testsuite/libgomp.fortran/appendix-a/a.19.1.f9060
1 files changed, 0 insertions, 60 deletions
diff --git a/gcc-4.2.1-5666.3/libgomp/testsuite/libgomp.fortran/appendix-a/a.19.1.f90 b/gcc-4.2.1-5666.3/libgomp/testsuite/libgomp.fortran/appendix-a/a.19.1.f90
deleted file mode 100644
index 1fe1c4247..000000000
--- a/gcc-4.2.1-5666.3/libgomp/testsuite/libgomp.fortran/appendix-a/a.19.1.f90
+++ /dev/null
@@ -1,60 +0,0 @@
-! { dg-do run }
- SUBROUTINE F1(Q)
- COMMON /DATA/ P, X
- INTEGER, TARGET :: X
- INTEGER, POINTER :: P
- INTEGER Q
- Q=1
-!$OMP FLUSH
- ! X, P and Q are flushed
- ! because they are shared and accessible
- END SUBROUTINE F1
- SUBROUTINE F2(Q)
- COMMON /DATA/ P, X
- INTEGER, TARGET :: X
- INTEGER, POINTER :: P
- INTEGER Q
-!$OMP BARRIER
- Q=2
-!$OMP BARRIER
- ! a barrier implies a flush
- ! X, P and Q are flushed
- ! because they are shared and accessible
- END SUBROUTINE F2
-
- INTEGER FUNCTION G(N)
- COMMON /DATA/ P, X
- INTEGER, TARGET :: X
- INTEGER, POINTER :: P
- INTEGER N
- INTEGER I, J, SUM
- I=1
- SUM = 0
- P=1
-!$OMP PARALLEL REDUCTION(+: SUM) NUM_THREADS(2)
- CALL F1(J)
- ! I, N and SUM were not flushed
- ! because they were not accessible in F1
- ! J was flushed because it was accessible
- SUM = SUM + J
- CALL F2(J)
- ! I, N, and SUM were not flushed
- ! because they were not accessible in f2
- ! J was flushed because it was accessible
- SUM = SUM + I + J + P + N
-!$OMP END PARALLEL
- G = SUM
- END FUNCTION G
-
- PROGRAM A19
- COMMON /DATA/ P, X
- INTEGER, TARGET :: X
- INTEGER, POINTER :: P
- INTEGER RESULT, G
- P => X
- RESULT = G(10)
- PRINT *, RESULT
- IF (RESULT .NE. 30) THEN
- CALL ABORT
- ENDIF
- END PROGRAM A19