128 lines
4.4 KiB
Fortran
128 lines
4.4 KiB
Fortran
|
! This test checks lowering of OpenACC routine directive.
|
||
|
|
||
|
! RUN: bbc -fopenacc -emit-hlfir %s -o - | FileCheck %s
|
||
|
|
||
|
! CHECK: acc.routine @acc_routine_17 func(@_QPacc_routine19) bind("_QPacc_routine17" [#acc.device_type<host>], "_QPacc_routine17" [#acc.device_type<default>], "_QPacc_routine16" [#acc.device_type<multicore>])
|
||
|
! CHECK: acc.routine @acc_routine_16 func(@_QPacc_routine18) bind("_QPacc_routine17" [#acc.device_type<host>], "_QPacc_routine16" [#acc.device_type<multicore>])
|
||
|
! CHECK: acc.routine @acc_routine_15 func(@_QPacc_routine17) worker ([#acc.device_type<host>]) vector ([#acc.device_type<multicore>])
|
||
|
! CHECK: acc.routine @acc_routine_14 func(@_QPacc_routine16) gang([#acc.device_type<nvidia>]) seq ([#acc.device_type<host>])
|
||
|
! CHECK: acc.routine @acc_routine_10 func(@_QPacc_routine11) seq
|
||
|
! CHECK: acc.routine @acc_routine_9 func(@_QPacc_routine10) seq
|
||
|
! CHECK: acc.routine @acc_routine_8 func(@_QPacc_routine9) bind("_QPacc_routine9a")
|
||
|
! CHECK: acc.routine @acc_routine_7 func(@_QPacc_routine8) bind("routine8_")
|
||
|
! CHECK: acc.routine @acc_routine_6 func(@_QPacc_routine7) gang(dim: 1 : i64)
|
||
|
! CHECK: acc.routine @acc_routine_5 func(@_QPacc_routine6) nohost
|
||
|
! CHECK: acc.routine @acc_routine_4 func(@_QPacc_routine5) worker
|
||
|
! CHECK: acc.routine @acc_routine_3 func(@_QPacc_routine4) vector
|
||
|
! CHECK: acc.routine @acc_routine_2 func(@_QPacc_routine3) gang
|
||
|
! CHECK: acc.routine @acc_routine_1 func(@_QPacc_routine2) seq
|
||
|
! CHECK: acc.routine @acc_routine_0 func(@_QPacc_routine1)
|
||
|
|
||
|
subroutine acc_routine1()
|
||
|
!$acc routine
|
||
|
end subroutine
|
||
|
|
||
|
! CHECK-LABEL: func.func @_QPacc_routine1() attributes {acc.routine_info = #acc.routine_info<[@acc_routine_0]>}
|
||
|
|
||
|
subroutine acc_routine2()
|
||
|
!$acc routine seq
|
||
|
end subroutine
|
||
|
|
||
|
! CHECK-LABEL: func.func @_QPacc_routine2() attributes {acc.routine_info = #acc.routine_info<[@acc_routine_1]>}
|
||
|
|
||
|
subroutine acc_routine3()
|
||
|
!$acc routine gang
|
||
|
end subroutine
|
||
|
|
||
|
! CHECK-LABEL: func.func @_QPacc_routine3() attributes {acc.routine_info = #acc.routine_info<[@acc_routine_2]>}
|
||
|
|
||
|
subroutine acc_routine4()
|
||
|
!$acc routine vector
|
||
|
end subroutine
|
||
|
|
||
|
! CHECK-LABEL: func.func @_QPacc_routine4() attributes {acc.routine_info = #acc.routine_info<[@acc_routine_3]>}
|
||
|
|
||
|
subroutine acc_routine5()
|
||
|
!$acc routine worker
|
||
|
end subroutine
|
||
|
|
||
|
! CHECK-LABEL: func.func @_QPacc_routine5() attributes {acc.routine_info = #acc.routine_info<[@acc_routine_4]>}
|
||
|
|
||
|
subroutine acc_routine6()
|
||
|
!$acc routine nohost
|
||
|
end subroutine
|
||
|
|
||
|
! CHECK-LABEL: func.func @_QPacc_routine6() attributes {acc.routine_info = #acc.routine_info<[@acc_routine_5]>}
|
||
|
|
||
|
subroutine acc_routine7()
|
||
|
!$acc routine gang(dim:1)
|
||
|
end subroutine
|
||
|
|
||
|
! CHECK-LABEL: func.func @_QPacc_routine7() attributes {acc.routine_info = #acc.routine_info<[@acc_routine_6]>}
|
||
|
|
||
|
subroutine acc_routine8()
|
||
|
!$acc routine bind("routine8_")
|
||
|
end subroutine
|
||
|
|
||
|
! CHECK-LABEL: func.func @_QPacc_routine8() attributes {acc.routine_info = #acc.routine_info<[@acc_routine_7]>}
|
||
|
|
||
|
subroutine acc_routine9a()
|
||
|
end subroutine
|
||
|
|
||
|
subroutine acc_routine9()
|
||
|
!$acc routine bind(acc_routine9a)
|
||
|
end subroutine
|
||
|
|
||
|
! CHECK-LABEL: func.func @_QPacc_routine9() attributes {acc.routine_info = #acc.routine_info<[@acc_routine_8]>}
|
||
|
|
||
|
function acc_routine10()
|
||
|
!$acc routine(acc_routine10) seq
|
||
|
end function
|
||
|
|
||
|
! CHECK-LABEL: func.func @_QPacc_routine10() -> f32 attributes {acc.routine_info = #acc.routine_info<[@acc_routine_9]>}
|
||
|
|
||
|
subroutine acc_routine11(a)
|
||
|
real :: a
|
||
|
!$acc routine(acc_routine11) seq
|
||
|
end subroutine
|
||
|
|
||
|
! CHECK-LABEL: func.func @_QPacc_routine11(%arg0: !fir.ref<f32> {fir.bindc_name = "a"}) attributes {acc.routine_info = #acc.routine_info<[@acc_routine_10]>}
|
||
|
|
||
|
subroutine acc_routine12()
|
||
|
|
||
|
interface
|
||
|
subroutine acc_routine11(a)
|
||
|
real :: a
|
||
|
!$acc routine(acc_routine11) seq
|
||
|
end subroutine
|
||
|
end interface
|
||
|
|
||
|
end subroutine
|
||
|
|
||
|
subroutine acc_routine13()
|
||
|
!$acc routine bind(acc_routine14)
|
||
|
end subroutine
|
||
|
|
||
|
subroutine acc_routine14()
|
||
|
end subroutine
|
||
|
|
||
|
subroutine acc_routine15()
|
||
|
!$acc routine bind(acc_routine16)
|
||
|
end subroutine
|
||
|
|
||
|
subroutine acc_routine16()
|
||
|
!$acc routine device_type(host) seq dtype(nvidia) gang
|
||
|
end subroutine
|
||
|
|
||
|
subroutine acc_routine17()
|
||
|
!$acc routine device_type(host) worker dtype(multicore) vector
|
||
|
end subroutine
|
||
|
|
||
|
subroutine acc_routine18()
|
||
|
!$acc routine device_type(host) bind(acc_routine17) dtype(multicore) bind(acc_routine16)
|
||
|
end subroutine
|
||
|
|
||
|
subroutine acc_routine19()
|
||
|
!$acc routine device_type(host,default) bind(acc_routine17) dtype(multicore) bind(acc_routine16)
|
||
|
end subroutine
|