blob: 25579272a6e0bc4bde470b5efa2416b884c89abc [file] [log] [blame]
!RUN: %flang_fc1 -emit-hlfir -fopenmp %s -o - | FileCheck %s
!CHECK: @_QPsb
subroutine sb(a)
integer :: a(:)
!CHECK: omp.parallel
!$omp parallel default(private)
!CHECK: hlfir.elemental
if (any(a/=(/(100,i=1,5)/))) print *, "OK"
!$omp end parallel
end subroutine