blob: 66c75bbe38f104aeab87ab64e936ec1b8e9e8235 [file] [log] [blame] [edit]
! RUN: bbc -emit-hlfir -fopenmp -o - %s 2>&1 | FileCheck %s
! RUN: %flang_fc1 -emit-hlfir -fopenmp -o - %s 2>&1 | FileCheck %s
! CHECK: omp.wsloop private({{.*}}) reduction(@max_i32
! CHECK: arith.cmpi sgt
! CHECK: arith.select
module m1
intrinsic max
end module m1
program main
use m1, ren=>max
n=0
!$omp parallel do reduction(ren:n)
do i=1,100
n=max(n,i)
end do
if (n/=100) print *,101
print *,'pass'
end program main