gcc/libgomp/testsuite/libgomp.oacc-fortran/optional-data-copyout.f90

97 lines
2.0 KiB
Fortran
Raw Normal View History

[OpenMP/OpenACC/Fortran] Fix mapping of optional (present|absent) arguments 2019-12-06 Tobias Burnus <tobias@codesourcery.com> Kwok Cheung Yeung <kcy@codesourcery.com> gcc/fortran/ * trans-openmp.c (gfc_build_conditional_assign, gfc_build_conditional_assign_expr): New static functions. (gfc_omp_finish_clause, gfc_trans_omp_clauses): Handle mapping of absent optional arguments and fix mapping of present optional args. gcc/ * omp-low.c (lower_omp_target): For optional arguments, deref once more to obtain the type. libgomp/ * oacc-mem.c (update_dev_host, gomp_acc_insert_pointer): Just return if input it a NULL pointer. * testsuite/libgomp.oacc-c-c++-common/lib-43.c: Remove; dependent on diagnostic of NULL pointer. * testsuite/libgomp.oacc-c-c++-common/lib-47.c: Ditto. * testsuite/libgomp.fortran/optional-map.f90: New. * testsuite/libgomp.fortran/use_device_addr-1.f90 (test_dummy_opt_callee_1_absent): New. (test_dummy_opt_call_1): Call it. * testsuite/libgomp.fortran/use_device_addr-2.f90: Likewise. * testsuite/libgomp.fortran/use_device_addr-3.f90: Likewise. * testsuite/libgomp.fortran/use_device_addr-4.f90: Likewise. * testsuite/libgomp.oacc-fortran/optional-cache.f95: New. * testsuite/libgomp.oacc-fortran/optional-data-copyin-by-value.f90: New. * testsuite/libgomp.oacc-fortran/optional-data-copyin.f90: New. * testsuite/libgomp.oacc-fortran/optional-data-copyout.f90: New. * testsuite/libgomp.oacc-fortran/optional-data-enter-exit.f90: New. * testsuite/libgomp.oacc-fortran/optional-declare.f90: New. * testsuite/libgomp.oacc-fortran/optional-firstprivate.f90: New. * testsuite/libgomp.oacc-fortran/optional-host_data.f90: New. * testsuite/libgomp.oacc-fortran/optional-nested-calls.f90: New. * testsuite/libgomp.oacc-fortran/optional-private.f90: New. * testsuite/libgomp.oacc-fortran/optional-reduction.f90: New. * testsuite/libgomp.oacc-fortran/optional-update-device.f90: New. * testsuite/libgomp.oacc-fortran/optional-update-host.f90: New. Co-Authored-By: Kwok Cheung Yeung <kcy@codesourcery.com> From-SVN: r279043
2019-12-06 14:06:53 +01:00
! Test OpenACC data regions with a copy-out of optional arguments.
! { dg-do run }
program test
implicit none
integer, parameter :: n = 64
integer :: i
integer :: a_int, b_int, res_int
integer :: a_arr(n), b_arr(n), res_arr(n)
integer, allocatable :: a_alloc(:), b_alloc(:), res_alloc(:)
res_int = 0
call test_int(a_int, b_int)
if (res_int .ne. 0) stop 1
call test_int(a_int, b_int, res_int)
if (res_int .ne. a_int * b_int) stop 2
res_arr(:) = 0
do i = 1, n
a_arr(i) = i
b_arr(i) = n - i + 1
end do
call test_array(a_arr, b_arr)
do i = 1, n
if (res_arr(i) .ne. 0) stop 3
end do
call test_array(a_arr, b_arr, res_arr)
do i = 1, n
if (res_arr(i) .ne. a_arr(i) * b_arr(i)) stop 4
end do
allocate (a_alloc(n))
allocate (b_alloc(n))
allocate (res_alloc(n))
res_alloc(:) = 0
do i = 1, n
a_alloc(i) = i
b_alloc(i) = n - i + 1
end do
call test_allocatable(a_alloc, b_alloc)
do i = 1, n
if (res_alloc(i) .ne. 0) stop 5
end do
call test_allocatable(a_alloc, b_alloc, res_alloc)
do i = 1, n
if (res_alloc(i) .ne. a_alloc(i) * b_alloc(i)) stop 6
end do
deallocate (a_alloc)
deallocate (b_alloc)
deallocate (res_alloc)
contains
subroutine test_int(a, b, res)
integer :: a, b
integer, optional :: res
!$acc data copyin(a, b) copyout(res)
!$acc parallel
if (present(res)) res = a * b
!$acc end parallel
!$acc end data
end subroutine test_int
subroutine test_array(a, b, res)
integer :: a(n), b(n)
integer, optional :: res(n)
!$acc data copyin(a, b) copyout(res)
!$acc parallel loop
do i = 1, n
if (present(res)) res(i) = a(i) * b(i)
end do
!$acc end data
end subroutine test_array
subroutine test_allocatable(a, b, res)
integer, allocatable :: a(:), b(:)
integer, allocatable, optional :: res(:)
!$acc data copyin(a, b) copyout(res)
!$acc parallel loop
do i = 1, n
if (present(res)) res(i) = a(i) * b(i)
end do
!$acc end data
end subroutine test_allocatable
end program test