]> oss.titaniummirror.com Git - msp430-gcc.git/blobdiff - libgomp/testsuite/libgomp.fortran/appendix-a/a10.1.f90
Imported gcc-4.4.3
[msp430-gcc.git] / libgomp / testsuite / libgomp.fortran / appendix-a / a10.1.f90
diff --git a/libgomp/testsuite/libgomp.fortran/appendix-a/a10.1.f90 b/libgomp/testsuite/libgomp.fortran/appendix-a/a10.1.f90
new file mode 100644 (file)
index 0000000..c1564bf
--- /dev/null
@@ -0,0 +1,20 @@
+! { dg-do run }
+      SUBROUTINE WORK1()
+      END SUBROUTINE WORK1
+      SUBROUTINE WORK2()
+      END SUBROUTINE WORK2
+      PROGRAM A10
+!$OMP PARALLEL
+!$OMP SINGLE
+        print *, "Beginning work1."
+!$OMP END SINGLE
+        CALL WORK1()
+!$OMP SINGLE
+        print *, "Finishing work1."
+!$OMP END SINGLE
+!$OMP SINGLE
+        print *, "Finished work1 and beginning work2."
+!$OMP END SINGLE NOWAIT
+        CALL WORK2()
+!$OMP END PARALLEL
+      END PROGRAM A10