blob: f68f3a2d6ad26ab0571e80404d7f4860150d3976 [file] [log] [blame] [edit]
! This test checks lowering of num_tasks clause in taskloop directive.
! RUN: bbc -emit-hlfir -fopenmp -fopenmp-version=50 -o - %s 2>&1 | FileCheck %s
! RUN: %flang_fc1 -emit-hlfir -fopenmp -fopenmp-version=50 -o - %s 2>&1 | FileCheck %s
! CHECK-LABEL: omp.private
! CHECK-SAME: {type = private} @[[I_PRIVATE_TEST2:.*]] : i32
! CHECK-LABEL: omp.private
! CHECK-SAME: {type = firstprivate} @[[X_FIRSTPRIVATE_TEST2:.*]] : i32
! CHECK-SAME: copy {
! CHECK: hlfir.assign
! CHECK-LABEL: omp.private
! CHECK-SAME: {type = private} @[[I_PRIVATE:.*]] : i32
! CHECK-LABEL: omp.private
! CHECK-SAME: {type = firstprivate} @[[X_FIRSTPRIVATE:.*]] : i32
! CHECK-SAME: copy {
! CHECK: hlfir.assign
! CHECK-LABEL: func.func @_QPtest_num_tasks
! CHECK: %[[ALLOCA_I:.*]] = fir.alloca i32 {bindc_name = "i", uniq_name = "_QFtest_num_tasksEi"}
! CHECK: %[[DECL_I:.*]]:2 = hlfir.declare %[[ALLOCA_I]] {uniq_name = "_QFtest_num_tasksEi"} : (!fir.ref<i32>) -> (!fir.ref<i32>, !fir.ref<i32>)
! CHECK: %[[ALLOCA_X:.*]] = fir.alloca i32 {bindc_name = "x", uniq_name = "_QFtest_num_tasksEx"}
! CHECK: %[[DECL_X:.*]]:2 = hlfir.declare %[[ALLOCA_X]] {uniq_name = "_QFtest_num_tasksEx"} : (!fir.ref<i32>) -> (!fir.ref<i32>, !fir.ref<i32>)
! CHECK: %[[VAL_NUMTASKS:.*]] = arith.constant 10 : i32
subroutine test_num_tasks
integer :: i, x
! CHECK: omp.taskloop num_tasks(%[[VAL_NUMTASKS]]: i32)
! CHECK-SAME: private(@[[X_FIRSTPRIVATE]] %[[DECL_X]]#0 -> %[[ARG0:.*]], @[[I_PRIVATE]] %[[DECL_I]]#0 -> %[[ARG1:.*]] : !fir.ref<i32>, !fir.ref<i32>) {
! CHECK: omp.loop_nest (%[[ARG2:.*]]) : i32 = (%{{.*}}) to (%{{.*}}) inclusive step (%{{.*}}) {
!$omp taskloop num_tasks(10)
do i = 1, 1000
x = x + 1
end do
!$omp end taskloop
end subroutine test_num_tasks
! CHECK-LABEL: func.func @_QPtest_num_tasks_strict
subroutine test_num_tasks_strict
integer :: x, i
! CHECK: %[[NUM_TASKS:.*]] = arith.constant 10 : i32
! CHECK: omp.taskloop num_tasks(strict, %[[NUM_TASKS]]: i32)
!$omp taskloop num_tasks(strict:10)
do i = 1, 100
!CHECK: arith.addi
x = x + 1
end do
!$omp end taskloop
end subroutine