module psi_penv_mod use psb_const_mod use psi_comm_buffers_mod, only : psb_buffer_queue interface psb_init module procedure psb_init_mpik end interface interface psb_exit module procedure psb_exit_mpik end interface interface psb_abort module procedure psb_abort_mpik end interface interface psb_info module procedure psb_info_mpik end interface interface psb_barrier module procedure psb_barrier_mpik end interface #if defined(LONG_INTEGERS) interface psb_init module procedure psb_init_ipk end interface interface psb_exit module procedure psb_exit_ipk end interface interface psb_abort module procedure psb_abort_ipk end interface interface psb_info module procedure psb_info_ipk end interface interface psb_barrier module procedure psb_barrier_ipk end interface #endif interface psb_wtime module procedure psb_wtime end interface #if defined(SERIAL_MPI) integer(psb_mpik_), private, save :: nctxt=0 #else integer(psb_mpik_), save :: mpi_iamx_op, mpi_iamn_op integer(psb_mpik_), save :: mpi_i8amx_op, mpi_i8amn_op integer(psb_mpik_), save :: mpi_samx_op, mpi_samn_op integer(psb_mpik_), save :: mpi_damx_op, mpi_damn_op integer(psb_mpik_), save :: mpi_camx_op, mpi_camn_op integer(psb_mpik_), save :: mpi_zamx_op, mpi_zamn_op integer(psb_mpik_), save :: mpi_snrm2_op, mpi_dnrm2_op type(psb_buffer_queue), save :: psb_mesg_queue #endif private :: psi_get_sizes, psi_register_mpi_extras private :: psi_iamx_op, psi_iamn_op private :: psi_i8amx_op, psi_i8amn_op private :: psi_samx_op, psi_samn_op private :: psi_damx_op, psi_damn_op private :: psi_camx_op, psi_camn_op private :: psi_zamx_op, psi_zamn_op private :: psi_snrm2_op, psi_dnrm2_op contains ! !!!!!!!!!!!!!!!!!!!!!! ! ! Environment handling ! ! !!!!!!!!!!!!!!!!!!!!!! subroutine psi_get_sizes() use psb_const_mod real(psb_dpk_) :: dv(2) real(psb_spk_) :: sv(2) integer(psb_ipk_) :: iv(2) integer(psb_long_int_k_) :: ilv(2) call psi_c_diffadd(sv(1),sv(2),psb_sizeof_sp) call psi_c_diffadd(dv(1),dv(2),psb_sizeof_dp) call psi_c_diffadd(iv(1),iv(2),psb_sizeof_int) call psi_c_diffadd(ilv(1),ilv(2),psb_sizeof_long_int) end subroutine psi_get_sizes subroutine psi_register_mpi_extras(info) #ifdef MPI_MOD use mpi #endif implicit none #ifdef MPI_H include 'mpif.h' #endif integer(psb_mpik_) :: info #if defined(LONG_INTEGERS) psb_mpi_integer = mpi_integer8 #else psb_mpi_integer = mpi_integer #endif #if defined(SERIAL_MPI) #else if (info == 0) call mpi_op_create(psi_iamx_op,.true.,mpi_iamx_op,info) if (info == 0) call mpi_op_create(psi_iamn_op,.true.,mpi_iamn_op,info) if (info == 0) call mpi_op_create(psi_i8amx_op,.true.,mpi_i8amx_op,info) if (info == 0) call mpi_op_create(psi_i8amn_op,.true.,mpi_i8amn_op,info) if (info == 0) call mpi_op_create(psi_samx_op,.true.,mpi_samx_op,info) if (info == 0) call mpi_op_create(psi_samn_op,.true.,mpi_samn_op,info) if (info == 0) call mpi_op_create(psi_damx_op,.true.,mpi_damx_op,info) if (info == 0) call mpi_op_create(psi_damn_op,.true.,mpi_damn_op,info) if (info == 0) call mpi_op_create(psi_camx_op,.true.,mpi_camx_op,info) if (info == 0) call mpi_op_create(psi_camn_op,.true.,mpi_camn_op,info) if (info == 0) call mpi_op_create(psi_zamx_op,.true.,mpi_zamx_op,info) if (info == 0) call mpi_op_create(psi_zamn_op,.true.,mpi_zamn_op,info) if (info == 0) call mpi_op_create(psi_snrm2_op,.true.,mpi_snrm2_op,info) if (info == 0) call mpi_op_create(psi_dnrm2_op,.true.,mpi_dnrm2_op,info) #endif end subroutine psi_register_mpi_extras #if defined(LONG_INTEGERS) subroutine psb_init_ipk(ictxt,np,basectxt,ids) integer(psb_ipk_), intent(out) :: ictxt integer(psb_ipk_), intent(in), optional :: np, basectxt integer(psb_mpik_) :: iictxt integer(psb_mpik_) :: inp, ibasectxt if (present(np).and.present(basectxt)) then inp = np ibasectxt = basectxt call psb_init(iictxt,np=inp,basectxt=ibasectxt) else if (present(np)) then inp = np call psb_init(iictxt,np=inp) else if (present(basectxt)) then ibasectxt = basectxt call psb_init(iictxt,basectxt=ibasectxt) else call psb_init(iictxt) end if ictxt = iictxt end subroutine psb_init_ipk subroutine psb_exit_ipk(ictxt,close) integer(psb_ipk_), intent(inout) :: ictxt logical, intent(in), optional :: close integer(psb_mpik_) :: iictxt iictxt = ictxt call psb_exit(iictxt, close) end subroutine psb_exit_ipk subroutine psb_barrier_ipk(ictxt) integer(psb_ipk_), intent(in) :: ictxt integer(psb_mpik_) :: iictxt iictxt = ictxt call psb_barrier(iictxt) end subroutine psb_barrier_ipk subroutine psb_abort_ipk(ictxt,errc) integer(psb_ipk_), intent(in) :: ictxt integer(psb_ipk_), intent(in), optional :: errc integer(psb_mpik_) :: iictxt, ierrc iictxt = ictxt if (present(errc)) then ierrc = errc call psb_abort(iictxt,ierrc) else call psb_abort(iictxt) end if end subroutine psb_abort_ipk subroutine psb_info_ipk(ictxt,iam,np) integer(psb_ipk_), intent(in) :: ictxt integer(psb_ipk_), intent(out) :: iam, np integer(psb_mpik_) :: iictxt, iiam, inp iictxt = ictxt call psb_info(iictxt,iiam,inp) iam = iiam np = inp end subroutine psb_info_ipk #endif subroutine psb_init_mpik(ictxt,np,basectxt,ids) use psi_comm_buffers_mod use psb_const_mod use psb_error_mod ! !$ use psb_rsb_mod #ifdef MPI_MOD use mpi #endif implicit none #ifdef MPI_H include 'mpif.h' #endif integer(psb_mpik_), intent(out) :: ictxt integer(psb_mpik_), intent(in), optional :: np, basectxt, ids(:) integer(psb_mpik_) :: i, isnullcomm integer(psb_mpik_), allocatable :: iids(:) logical :: initialized integer(psb_mpik_) :: np_, npavail, iam, info, basecomm, basegroup, newgroup character(len=20), parameter :: name='psb_init' integer(psb_ipk_) :: iinfo call psb_set_debug_unit(psb_err_unit) #if defined(SERIAL_MPI) ictxt = nctxt nctxt = nctxt + 1 call psi_register_mpi_extras(info) call psi_get_sizes() #else call mpi_initialized(initialized,info) if ((.not.initialized).or.(info /= mpi_success)) then if (info == mpi_success) call mpi_init(info) if (info /= mpi_success) then write(psb_err_unit,*) 'Error in initalizing MPI, bailing out',info stop end if end if if (present(basectxt)) then basecomm = basectxt else basecomm = mpi_comm_world end if if (present(np)) then if (np < 1) then iinfo=psb_err_initerror_neugh_procs_ call psb_errpush(iinfo,name) call psb_error() ictxt = mpi_comm_null return endif call mpi_comm_size(basecomm,np_,info) if (np_ < np) then iinfo=psb_err_initerror_neugh_procs_ call psb_errpush(iinfo,name) call psb_error() ictxt = mpi_comm_null return endif call mpi_comm_group(basecomm,basegroup,info) if (present(ids)) then if (size(ids)np_)) then write(psb_err_unit,*) 'Error in init: invalid rank in input' ictxt = mpi_comm_null return end if end do call mpi_group_incl(basegroup,np,ids,newgroup,info) if (info /= mpi_success) then ictxt = mpi_comm_null return endif else allocate(iids(np),stat=info) if (info /= 0) then ictxt = mpi_comm_null return endif do i=1, np iids(i) = i-1 end do call mpi_group_incl(basegroup,np,iids,newgroup,info) if (info /= mpi_success) then ictxt = mpi_comm_null return endif deallocate(iids) end if call mpi_comm_create(basecomm,newgroup,ictxt,info) else if (basecomm /= mpi_comm_null) then call mpi_comm_dup(basecomm,ictxt,info) else ictxt = mpi_comm_null end if endif call psi_register_mpi_extras(info) call psi_get_sizes() if (ictxt == mpi_comm_null) return #endif ! !$ call psb_rsb_init(info) ! !$ if (info.ne.psb_rsb_const_success) then ! !$ if (info.eq.psb_rsb_const_not_available) then ! !$ info=psb_success_ ! rsb is not present ! !$ else ! !$ ! rsb failed to initialize, and we issue an internal error. ! !$ ! or shall we tolerate this ? ! !$ info=psb_err_internal_error_ ! !$ call psb_errpush(info,name) ! !$ call psb_error(ictxt) ! !$ endif ! !$ endif end subroutine psb_init_mpik subroutine psb_exit_mpik(ictxt,close) use psi_comm_buffers_mod ! !$ use psb_rsb_mod #ifdef MPI_MOD use mpi #endif implicit none #ifdef MPI_H include 'mpif.h' #endif integer(psb_mpik_), intent(inout) :: ictxt logical, intent(in), optional :: close logical :: close_ integer(psb_mpik_) :: info character(len=20), parameter :: name='psb_exit' info = 0 if (present(close)) then close_ = close else close_ = .true. end if ! !$ if (close_) call psb_rsb_exit(info) ! !$ if (info.ne.psb_rsb_const_success) then ! !$ if (info.eq.psb_rsb_const_not_available) then ! !$ info=psb_success_ ! rsb is not present ! !$ else ! !$ info=psb_err_internal_error_ ! rsb failed to exit, and we issue an internal error. or shall we tolerate this ? ! !$ call psb_errpush(info,name) ! !$ call psb_error(ictxt) ! !$ endif ! !$ endif #if defined(SERIAL_MPI) ! Under serial mode, CLOSE has no effect, but reclaim ! the used ICTXT number. nctxt = max(0, nctxt - 1) #else if (close_) then call psb_close_all_context(psb_mesg_queue) else call psb_close_context(psb_mesg_queue,ictxt) end if if ((ictxt /= mpi_comm_null).and.(ictxt /= mpi_comm_world)) then call mpi_comm_Free(ictxt,info) end if if (close_) call mpi_finalize(info) #endif end subroutine psb_exit_mpik subroutine psb_barrier_mpik(ictxt) #ifdef MPI_MOD use mpi #endif implicit none #ifdef MPI_H include 'mpif.h' #endif integer(psb_mpik_), intent(in) :: ictxt integer(psb_mpik_) :: info #if !defined(SERIAL_MPI) if (ictxt /= mpi_comm_null) then call mpi_barrier(ictxt, info) end if #endif end subroutine psb_barrier_mpik function psb_wtime() use psb_const_mod #ifdef MPI_MOD use mpi #endif implicit none #ifdef MPI_H include 'mpif.h' #endif real(psb_dpk_) :: psb_wtime psb_wtime = mpi_wtime() end function psb_wtime subroutine psb_abort_mpik(ictxt,errc) use psi_comm_buffers_mod integer(psb_mpik_), intent(in) :: ictxt integer(psb_mpik_), intent(in), optional :: errc integer(psb_mpik_) :: code, info #if defined(SERIAL_MPI) stop #else if (present(errc)) then code = errc else code = -1 endif call mpi_abort(ictxt,code,info) #endif end subroutine psb_abort_mpik subroutine psb_info_mpik(ictxt,iam,np) use psi_comm_buffers_mod #ifdef MPI_MOD use mpi #endif implicit none #ifdef MPI_H include 'mpif.h' #endif integer(psb_mpik_), intent(in) :: ictxt integer(psb_mpik_), intent(out) :: iam, np integer(psb_mpik_) :: info #if defined(SERIAL_MPI) iam = 0 np = 1 #else iam = -1 np = -1 if (ictxt /= mpi_comm_null) then call mpi_comm_size(ictxt,np,info) if (info /= mpi_success) np = -1 call mpi_comm_rank(ictxt,iam,info) if (info /= mpi_success) iam = -1 end if #endif end subroutine psb_info_mpik subroutine psb_get_mpicomm(ictxt,comm) integer(psb_mpik_) :: ictxt, comm comm = ictxt end subroutine psb_get_mpicomm subroutine psb_get_rank(rank,ictxt,id) integer(psb_mpik_) :: rank,ictxt,id rank = id end subroutine psb_get_rank ! !!!!!!!!!!!!!!!!!!!!!! ! ! Base binary operations ! ! !!!!!!!!!!!!!!!!!!!!!! subroutine psi_iamx_op(inv, outv,len,type) integer(psb_ipk_) :: inv(*),outv(*) integer(psb_ipk_) :: len,type integer(psb_ipk_) :: i do i=1, len if (abs(inv(i)) > abs(outv(i))) outv(i) = inv(i) end do end subroutine psi_iamx_op subroutine psi_iamn_op(inv, outv,len,type) integer(psb_ipk_) :: inv(*),outv(*) integer(psb_ipk_) :: len,type integer(psb_ipk_) :: i do i=1, len if (abs(inv(i)) < abs(outv(i))) outv(i) = inv(i) end do end subroutine psi_iamn_op subroutine psi_i8amx_op(inv, outv,len,type) integer(psb_long_int_k_) :: inv(*),outv(*) integer(psb_ipk_) :: len,type integer(psb_ipk_) :: i do i=1, len if (abs(inv(i)) > abs(outv(i))) outv(i) = inv(i) end do end subroutine psi_i8amx_op subroutine psi_i8amn_op(inv, outv,len,type) #ifdef MPI_MOD use mpi #endif implicit none #ifdef MPI_H include 'mpif.h' #endif integer(psb_long_int_k_) :: inv(*),outv(*) integer(psb_ipk_) :: len,type integer(psb_ipk_) :: i if (type /= mpi_integer8) then write(psb_err_unit,*) 'Invalid type !!!' end if do i=1, len if (abs(inv(i)) < abs(outv(i))) outv(i) = inv(i) end do end subroutine psi_i8amn_op subroutine psi_samx_op(vin,vinout,len,itype) integer(psb_ipk_), intent(in) :: len, itype real(psb_spk_), intent(in) :: vin(len) real(psb_spk_), intent(inout) :: vinout(len) integer(psb_ipk_) :: i do i=1, len if (abs(vinout(i)) < abs(vin(i))) vinout(i) = vin(i) end do end subroutine psi_samx_op subroutine psi_samn_op(vin,vinout,len,itype) integer(psb_ipk_), intent(in) :: len, itype real(psb_spk_), intent(in) :: vin(len) real(psb_spk_), intent(inout) :: vinout(len) integer(psb_ipk_) :: i do i=1, len if (abs(vinout(i)) > abs(vin(i))) vinout(i) = vin(i) end do end subroutine psi_samn_op subroutine psi_damx_op(vin,vinout,len,itype) integer(psb_ipk_), intent(in) :: len, itype real(psb_dpk_), intent(in) :: vin(len) real(psb_dpk_), intent(inout) :: vinout(len) integer(psb_ipk_) :: i do i=1, len if (abs(vinout(i)) < abs(vin(i))) vinout(i) = vin(i) end do end subroutine psi_damx_op subroutine psi_damn_op(vin,vinout,len,itype) integer(psb_ipk_), intent(in) :: len, itype real(psb_dpk_), intent(in) :: vin(len) real(psb_dpk_), intent(inout) :: vinout(len) integer(psb_ipk_) :: i do i=1, len if (abs(vinout(i)) > abs(vin(i))) vinout(i) = vin(i) end do end subroutine psi_damn_op subroutine psi_camx_op(vin,vinout,len,itype) integer(psb_ipk_), intent(in) :: len, itype complex(psb_spk_), intent(in) :: vin(len) complex(psb_spk_), intent(inout) :: vinout(len) integer(psb_ipk_) :: i do i=1, len if (abs(vinout(i)) < abs(vin(i))) vinout(i) = vin(i) end do end subroutine psi_camx_op subroutine psi_camn_op(vin,vinout,len,itype) integer(psb_ipk_), intent(in) :: len, itype complex(psb_spk_), intent(in) :: vin(len) complex(psb_spk_), intent(inout) :: vinout(len) integer(psb_ipk_) :: i do i=1, len if (abs(vinout(i)) > abs(vin(i))) vinout(i) = vin(i) end do end subroutine psi_camn_op subroutine psi_zamx_op(vin,vinout,len,itype) integer(psb_ipk_), intent(in) :: len, itype complex(psb_dpk_), intent(in) :: vin(len) complex(psb_dpk_), intent(inout) :: vinout(len) integer(psb_ipk_) :: i do i=1, len if (abs(vinout(i)) < abs(vin(i))) vinout(i) = vin(i) end do end subroutine psi_zamx_op subroutine psi_zamn_op(vin,vinout,len,itype) integer(psb_ipk_), intent(in) :: len, itype complex(psb_dpk_), intent(in) :: vin(len) complex(psb_dpk_), intent(inout) :: vinout(len) integer(psb_ipk_) :: i do i=1, len if (abs(vinout(i)) > abs(vin(i))) vinout(i) = vin(i) end do end subroutine psi_zamn_op subroutine psi_snrm2_op(vin,vinout,len,itype) implicit none integer(psb_ipk_), intent(in) :: len, itype real(psb_spk_), intent(in) :: vin(len) real(psb_spk_), intent(inout) :: vinout(len) integer(psb_ipk_) :: i real(psb_spk_) :: w, z do i=1, len w = max( vin(i), vinout(i) ) z = min( vin(i), vinout(i) ) if ( z == szero ) then vinout(i) = w else vinout(i) = w*sqrt( sone+( z / w )**2 ) end if end do end subroutine psi_snrm2_op subroutine psi_dnrm2_op(vin,vinout,len,itype) implicit none integer(psb_ipk_), intent(in) :: len, itype real(psb_dpk_), intent(in) :: vin(len) real(psb_dpk_), intent(inout) :: vinout(len) integer(psb_ipk_) :: i real(psb_dpk_) :: w, z do i=1, len w = max( vin(i), vinout(i) ) z = min( vin(i), vinout(i) ) if ( z == dzero ) then vinout(i) = w else vinout(i) = w*sqrt( done+( z / w )**2 ) end if end do end subroutine psi_dnrm2_op end module psi_penv_mod