OpenCores
URL https://opencores.org/ocsvn/openrisc/openrisc/trunk

Subversion Repositories openrisc

[/] [openrisc/] [tags/] [gnu-src/] [gcc-4.5.1/] [gcc-4.5.1-or32-1.0rc1/] [gcc/] [testsuite/] [gfortran.dg/] [gomp/] [appendix-a/] [a.35.1.f90] - Rev 427

Go to most recent revision | Compare with Previous | Blame | View Log

! { dg-do compile }

      SUBROUTINE WORK(I, J)
      INTEGER I, J
      END SUBROUTINE WORK
      SUBROUTINE WRONG1(N)
      INTEGER N
        INTEGER I,J
!$OMP PARALLEL DEFAULT(SHARED)
!$OMP DO
          DO I = 1, N
             ! incorrect nesting of loop regions
!$OMP DO     ! { dg-warning "may not be closely nested" }
             DO J = 1, N
                CALL WORK(I,J)
             END DO
          END DO
!$OMP END PARALLEL
      END SUBROUTINE WRONG1

Go to most recent revision | Compare with Previous | Blame | View Log

powered by: WebSVN 2.1.0

© copyright 1999-2024 OpenCores.org, equivalent to Oliscience, all rights reserved. OpenCores®, registered trademark.