blob: 160302a2b17ba90603a580289acf4028f77cf5a0 [file] [log] [blame]
! { dg-do compile }
SUBROUTINE WRONG3(N)
INTEGER N
INTEGER I
!$OMP PARALLEL DEFAULT(SHARED)
!$OMP DO
DO I = 1, N
! incorrect nesting of regions
!$OMP SINGLE ! { dg-error "may not be closely nested" }
CALL WORK(I, 1)
!$OMP END SINGLE
END DO
!$OMP END PARALLEL
END SUBROUTINE WRONG3