blob: 6e7be46eb3c48ef7f03e8f0d08a59c9b207d242d [file] [log] [blame]
! { dg-do run }
!
! CO_REDUCE
!
implicit none (type, external)
intrinsic :: co_reduce
integer :: stat
integer :: i4, i4_2, i
i4 = 21 * this_image()
i4_2 = 21
do i = 2, num_images()
i4_2 = i4_2 * 21 * i
end do
call co_reduce(i4, op_i4, stat=stat)
if (stat /= 0) call abort()
if (i4_2 /= i4) call abort()
contains
pure integer function op_i4(a,b)
integer, value :: a, b
op_i4 = a * b
end function op_i4
end