Break circular dependency between FIR dialect and utilities
[llvm-project.git] / flang / test / Lower / OpenMP / Todo / reduction-iand.f90
blobf1b9b025d2a169e817bc5c30d87740f5a54cc620
1 ! RUN: %not_todo_cmd bbc -emit-fir -fopenmp -o - %s 2>&1 | FileCheck %s
2 ! RUN: %not_todo_cmd %flang_fc1 -emit-fir -fopenmp -o - %s 2>&1 | FileCheck %s
4 ! CHECK: not yet implemented: Reduction of intrinsic procedures is not supported
5 subroutine reduction_iand(y)
6 integer :: x, y(:)
7 x = 0
8 !$omp parallel
9 !$omp do reduction(iand:x)
10 do i=1, 100
11 x = iand(x, y(i))
12 end do
13 !$omp end do
14 !$omp end parallel
15 print *, x
16 end subroutine