]> oss.titaniummirror.com Git - msp430-gcc.git/blobdiff - libgomp/testsuite/libgomp.fortran/appendix-a/a.21.1.f90
Imported gcc-4.4.3
[msp430-gcc.git] / libgomp / testsuite / libgomp.fortran / appendix-a / a.21.1.f90
diff --git a/libgomp/testsuite/libgomp.fortran/appendix-a/a.21.1.f90 b/libgomp/testsuite/libgomp.fortran/appendix-a/a.21.1.f90
new file mode 100644 (file)
index 0000000..c22fa11
--- /dev/null
@@ -0,0 +1,19 @@
+! { dg-do compile }
+      SUBROUTINE WORK(K)
+        INTEGER k
+!$OMP ORDERED
+        WRITE(*,*) K
+!$OMP END ORDERED
+      END SUBROUTINE WORK
+      SUBROUTINE SUBA21(LB, UB, STRIDE)
+        INTEGER LB, UB, STRIDE
+        INTEGER I
+!$OMP PARALLEL DO ORDERED SCHEDULE(DYNAMIC)
+        DO I=LB,UB,STRIDE
+          CALL WORK(I)
+        END DO
+!$OMP END PARALLEL DO
+      END SUBROUTINE SUBA21
+      PROGRAM A21
+        CALL SUBA21(1,100,5)
+      END PROGRAM A21