summaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/gomp/appendix-a/a.35.4.f90
blob: f130dd5f480742aeb6f2526492d852055c01009d (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
! { dg-do compile }

      SUBROUTINE WRONG4(N)
      INTEGER N
        INTEGER I
!$OMP PARALLEL DEFAULT(SHARED)
!$OMP DO
          DO I = 1, N
             CALL WORK(I, 1)
! incorrect nesting of barrier region in a loop region
!$OMP BARRIER	! { dg-warning "may not be closely nested" }
             CALL WORK(I, 2)
          END DO
!$OMP END PARALLEL
      END SUBROUTINE WRONG4