!!$ !!$ Parallel Sparse BLAS version 3.1 !!$ (C) Copyright 2006, 2007, 2008, 2009, 2010, 2012, 2013 !!$ Salvatore Filippone University of Rome Tor Vergata !!$ Alfredo Buttari CNRS-IRIT, Toulouse !!$ !!$ Redistribution and use in source and binary forms, with or without !!$ modification, are permitted provided that the following conditions !!$ are met: !!$ 1. Redistributions of source code must retain the above copyright !!$ notice, this list of conditions and the following disclaimer. !!$ 2. Redistributions in binary form must reproduce the above copyright !!$ notice, this list of conditions, and the following disclaimer in the !!$ documentation and/or other materials provided with the distribution. !!$ 3. The name of the PSBLAS group or the names of its contributors may !!$ not be used to endorse or promote products derived from this !!$ software without specific written permission. !!$ !!$ THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS !!$ ``AS IS'' AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT LIMITED !!$ TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR !!$ PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE PSBLAS GROUP OR ITS CONTRIBUTORS !!$ BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, SPECIAL, EXEMPLARY, OR !!$ CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED TO, PROCUREMENT OF !!$ SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR PROFITS; OR BUSINESS !!$ INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF LIABILITY, WHETHER IN !!$ CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING NEGLIGENCE OR OTHERWISE) !!$ ARISING IN ANY WAY OUT OF THE USE OF THIS SOFTWARE, EVEN IF ADVISED OF THE !!$ POSSIBILITY OF SUCH DAMAGE. !!$ !!$ module psb_error_mod use psb_const_mod integer(psb_ipk_), parameter, public :: psb_act_ret_=0, psb_act_abort_=1 integer(psb_ipk_), parameter, public :: psb_debug_ext_=1, psb_debug_outer_=2 integer(psb_ipk_), parameter, public :: psb_debug_comp_=3, psb_debug_inner_=4 integer(psb_ipk_), parameter, public :: psb_debug_serial_=8, psb_debug_serial_comp_=9 integer(psb_ipk_), parameter, public :: psb_no_err_ = 0 integer(psb_ipk_), parameter, public :: psb_err_warning_ = 1 integer(psb_ipk_), parameter, public :: psb_err_fatal_ = 2 ! ! Error handling ! public psb_errpush, psb_error, psb_get_errstatus,& & psb_errstatus_fatal, psb_errstatus_warning,& & psb_errstatus_ok, psb_warning_push,& & psb_errpop, psb_errmsg, psb_errcomm, psb_get_numerr, & & psb_get_errverbosity, psb_set_errverbosity, & & psb_erractionsave, psb_erractionrestore, & & psb_get_erraction, psb_set_erraction, & & psb_get_debug_level, psb_set_debug_level,& & psb_get_debug_unit, psb_set_debug_unit,& & psb_get_serial_debug_level, psb_set_serial_debug_level interface psb_error subroutine psb_serror() end subroutine psb_serror subroutine psb_perror(ictxt) import :: psb_mpik_ integer(psb_mpik_), intent(in) :: ictxt end subroutine psb_perror end interface interface psb_errcomm subroutine psb_errcomm(ictxt, err) import :: psb_mpik_, psb_ipk_ integer(psb_mpik_), intent(in) :: ictxt integer(psb_ipk_), intent(inout):: err end subroutine psb_errcomm end interface psb_errcomm #if defined(LONG_INTEGERS) interface psb_error module procedure psb_perror_ipk end interface psb_error interface psb_errcomm module procedure psb_errcomm_ipk end interface psb_errcomm #endif private type psb_errstack_node ! the error code integer(psb_ipk_) :: err_code=0 ! the name of the routine generating the error character(len=20) :: routine='' ! array of integer data to complete the error msg integer(psb_ipk_),dimension(5) :: i_err_data=0 ! real(psb_dpk_)(dim=10) :: r_err_data=0.d0 ! array of real data to complete the error msg ! complex(dim=10) :: c_err_data=0.c0 ! array of complex data to complete the error msg ! array of character data to complete the error msg character(len=40) :: a_err_data='' ! pointer to the next element in the stack type(psb_errstack_node), pointer :: next end type psb_errstack_node type psb_errstack ! pointer to the top element of the stack type(psb_errstack_node), pointer :: top => null() ! number of entries in the stack integer(psb_ipk_) :: n_elems=0 end type psb_errstack type(psb_errstack), save :: error_stack integer(psb_ipk_), save :: error_status = psb_no_err_ integer(psb_ipk_), save :: verbosity_level = 1 integer(psb_ipk_), save :: err_action = psb_act_abort_ integer(psb_ipk_), save :: debug_level=0, debug_unit, serial_debug_level=0 contains #if defined(LONG_INTEGERS) subroutine psb_errcomm_ipk(ictxt, err) integer(psb_ipk_), intent(in) :: ictxt integer(psb_ipk_), intent(inout):: err integer(psb_mpik_) :: iictxt iictxt = ictxt call psb_errcomm(iictxt,err) end subroutine psb_errcomm_ipk subroutine psb_perror_ipk(ictxt) integer(psb_ipk_), intent(in) :: ictxt integer(psb_mpik_) :: iictxt iictxt = ictxt call psb_perror(iictxt) end subroutine psb_perror_ipk #endif ! saves action to support error traceback ! also changes error action to "return" subroutine psb_erractionsave(err_act) integer(psb_ipk_), intent(out) :: err_act err_act = err_action err_action = psb_act_ret_ end subroutine psb_erractionsave ! return the action to take upon error occurrence subroutine psb_get_erraction(err_act) integer(psb_ipk_), intent(out) :: err_act err_act=err_action end subroutine psb_get_erraction ! sets the action to take upon error occurrence subroutine psb_set_erraction(err_act) integer(psb_ipk_), intent(in) :: err_act err_action=err_act end subroutine psb_set_erraction ! restores error action previously saved with psb_erractionsave subroutine psb_erractionrestore(err_act) integer(psb_ipk_), intent(in) :: err_act err_action = err_act end subroutine psb_erractionrestore function psb_get_debug_level() integer(psb_ipk_) :: psb_get_debug_level psb_get_debug_level = debug_level end function psb_get_debug_level subroutine psb_set_debug_level(level) integer(psb_ipk_), intent(in) :: level if (level >= 0) then debug_level = level else debug_level = 0 end if end subroutine psb_set_debug_level function psb_get_debug_unit() integer(psb_ipk_) :: psb_get_debug_unit psb_get_debug_unit = debug_unit end function psb_get_debug_unit subroutine psb_set_debug_unit(unit) integer(psb_ipk_), intent(in) :: unit if ((unit >= 0).or.(unit == psb_err_unit)& & .or.(unit == psb_out_unit)) then debug_unit = unit else debug_unit = 0 end if end subroutine psb_set_debug_unit function psb_get_serial_debug_level() integer(psb_ipk_) :: psb_get_serial_debug_level psb_get_serial_debug_level = serial_debug_level end function psb_get_serial_debug_level subroutine psb_set_serial_debug_level(level) integer(psb_ipk_), intent(in) :: level if (level >= 0) then serial_debug_level = level else serial_debug_level = 0 end if end subroutine psb_set_serial_debug_level ! sets verbosity of the error message subroutine psb_set_errverbosity(v) integer(psb_ipk_), intent(in) :: v verbosity_level=v end subroutine psb_set_errverbosity ! returns number of errors function psb_get_numerr() integer(psb_ipk_) :: psb_get_numerr psb_get_numerr = error_stack%n_elems end function psb_get_numerr ! returns verbosity of the error message function psb_get_errverbosity() integer(psb_ipk_) :: psb_get_errverbosity psb_get_errverbosity=verbosity_level end function psb_get_errverbosity ! checks the status of the error condition function psb_get_errstatus() integer(psb_ipk_) :: psb_get_errstatus psb_get_errstatus = error_status end function psb_get_errstatus subroutine psb_set_errstatus(ircode) integer(psb_ipk_) :: ircode if ((psb_no_err_<=ircode).and.(ircode <= psb_err_fatal_))& & error_status=ircode end subroutine psb_set_errstatus function psb_errstatus_fatal() result(res) logical :: res res = (error_status == psb_err_fatal_) end function psb_errstatus_fatal function psb_errstatus_warning() result(res) logical :: res res = (error_status == psb_err_warning_) end function psb_errstatus_warning function psb_errstatus_ok() result(res) logical :: res res = (error_status == psb_no_err_) end function psb_errstatus_ok ! pushes an error on the error stack subroutine psb_stackpush(err_c, r_name, i_err, a_err) integer(psb_ipk_), intent(in) :: err_c character(len=*), intent(in) :: r_name character(len=*), optional :: a_err integer(psb_ipk_), optional :: i_err(5) type(psb_errstack_node), pointer :: new_node allocate(new_node) new_node%err_code = err_c new_node%routine = r_name if(present(i_err)) then new_node%i_err_data = i_err end if if(present(a_err)) then new_node%a_err_data = a_err end if new_node%next => error_stack%top error_stack%top => new_node error_stack%n_elems = error_stack%n_elems+1 nullify(new_node) end subroutine psb_stackpush ! pushes an error on the error stack subroutine psb_errpush(err_c, r_name, i_err, a_err) integer(psb_ipk_), intent(in) :: err_c character(len=*), intent(in) :: r_name character(len=*), optional :: a_err integer(psb_ipk_), optional :: i_err(5) type(psb_errstack_node), pointer :: new_node call psb_set_errstatus(psb_err_fatal_) call psb_stackpush(err_c, r_name, i_err, a_err) end subroutine psb_errpush ! pushes a warning on the error stack subroutine psb_warning_push(err_c, r_name, i_err, a_err) integer(psb_ipk_), intent(in) :: err_c character(len=*), intent(in) :: r_name character(len=*), optional :: a_err integer(psb_ipk_), optional :: i_err(5) type(psb_errstack_node), pointer :: new_node if (.not.psb_errstatus_fatal())& & call psb_set_errstatus( psb_err_warning_) call psb_stackpush(err_c, r_name, i_err, a_err) end subroutine psb_warning_push ! pops an error from the error stack subroutine psb_errpop(err_c, r_name, i_e_d, a_e_d) integer(psb_ipk_), intent(out) :: err_c character(len=20), intent(out) :: r_name character(len=40), intent(out) :: a_e_d integer(psb_ipk_), intent(out) :: i_e_d(5) type(psb_errstack_node), pointer :: old_node err_c = error_stack%top%err_code r_name = error_stack%top%routine i_e_d = error_stack%top%i_err_data a_e_d = error_stack%top%a_err_data old_node => error_stack%top error_stack%top => old_node%next error_stack%n_elems = error_stack%n_elems - 1 if (error_stack%n_elems == 0) error_status=0 deallocate(old_node) end subroutine psb_errpop ! prints the error msg associated to a specific error code subroutine psb_errmsg(err_c, r_name, i_e_d, a_e_d,me) integer(psb_ipk_), intent(in) :: err_c character(len=20), intent(in) :: r_name character(len=40), intent(in) :: a_e_d integer(psb_ipk_), intent(in) :: i_e_d(5) integer(psb_mpik_), optional :: me if(present(me)) then write(psb_err_unit,& & '("Process: ",i0,". PSBLAS Error (",i0,") in subroutine: ",a20)')& & me,err_c,trim(r_name) else write(psb_err_unit,'("PSBLAS Error (",i0,") in subroutine: ",a)')& & err_c,trim(r_name) end if select case (err_c) case(:psb_success_) write(psb_err_unit,'("error on calling sperror. err_c must be greater than 0")') case(psb_err_pivot_too_small_) write(psb_err_unit,'("pivot too small: ",i0,1x,a)')i_e_d(1),trim(a_e_d) case(psb_err_invalid_ovr_num_) write(psb_err_unit,'("Invalid number of ovr:",i0)')i_e_d(1) case(psb_err_invalid_input_) write(psb_err_unit,'("Invalid input")') case(psb_err_iarg_neg_) write(psb_err_unit,'("input argument n. ",i0," cannot be less than 0")')i_e_d(1) write(psb_err_unit,'("current value is ",i0)')i_e_d(2) case(psb_err_iarg_pos_) write(psb_err_unit,'("input argument n. ",i0," cannot be greater than 0")')i_e_d(1) write(psb_err_unit,'("current value is ",i0)')i_e_d(2) case(psb_err_input_value_invalid_i_) write(psb_err_unit,'("input argument n. ",i0," has an invalid value")')i_e_d(1) write(psb_err_unit,'("current value is ",i0)')i_e_d(2) case(psb_err_input_asize_invalid_i_) write(psb_err_unit,'("Size of input array argument n. ",i0," is invalid.")')i_e_d(1) write(psb_err_unit,'("Current value is ",i0)')i_e_d(2) case(psb_err_input_asize_small_i_) write(psb_err_unit,'("Size of input array argument n. ",i0," is too small.")')i_e_d(1) write(psb_err_unit,'("Current value is ",i0," Should be at least ",i0)') i_e_d(2),i_e_d(3) case(psb_err_iarg_invalid_i_) write(psb_err_unit,'("input argument n. ",i0," has an invalid value")')i_e_d(1) write(psb_err_unit,'("current value is ",a)')a_e_d(2:2) case(psb_err_iarg_not_gtia_ii_) write(psb_err_unit,& & '("input argument n. ",i0," must be equal or greater than input argument n. ",i0)') & & i_e_d(1), i_e_d(3) write(psb_err_unit,'("current values are ",i0," < ",i0)')& & i_e_d(2),i_e_d(5) case(psb_err_iarg_not_gteia_ii_) write(psb_err_unit,'("input argument n. ",i0," must be greater than or equal to ",i0)')& & i_e_d(1),i_e_d(2) write(psb_err_unit,'("current value is ",i0," < ",i0)')& & i_e_d(3), i_e_d(2) case(psb_err_iarg_invalid_value_) write(psb_err_unit,'("input argument n. ",i0," in entry # ",i0," has an invalid value")')& & i_e_d(1:2) write(psb_err_unit,'("current value is ",a)')trim(a_e_d) case(psb_err_asb_nrc_error_) write(psb_err_unit,'("Impossible error in ASB: nrow>ncol,")') write(psb_err_unit,'("Actual values are ",i0," > ",i0)')i_e_d(1:2) ! ... csr format error ... case(psb_err_iarg2_neg_) write(psb_err_unit,'("input argument ia2(1) is less than 0")') write(psb_err_unit,'("current value is ",i0)')i_e_d(1) ! ... csr format error ... case(psb_err_ia2_not_increasing_) write(psb_err_unit,'("indices in ia2 array are not in increasing order")') case(psb_err_ia1_not_increasing_) write(psb_err_unit,'("indices in ia1 array are not in increasing order")') ! ... csr format error ... case(psb_err_ia1_badindices_) write(psb_err_unit,'("indices in ia1 array are not within problem dimension")') write(psb_err_unit,'("problem dimension is ",i0)')i_e_d(1) case(psb_err_invalid_args_combination_) write(psb_err_unit,'("invalid combination of input arguments")') case(psb_err_invalid_pid_arg_) write(psb_err_unit,'("Invalid process identifier in input array argument n. ",i0,".")')& & i_e_d(1) write(psb_err_unit,'("Current value is ",i0)')i_e_d(2) case(psb_err_iarg_n_mbgtian_) write(psb_err_unit,'("input argument n. ",i0," must be greater than input argument n. ",i0)')& & i_e_d(1:2) write(psb_err_unit,'("current values are ",i0," < ",i0)') i_e_d(3:4) case(psb_err_dupl_cd_vl) write(psb_err_unit,'("there are duplicated entries in vl (input to cdall)")') ! ... coo format error ... ! ... coo format error ... case(psb_err_duplicate_coo) write(psb_err_unit,'("there are duplicated elements in coo format")') write(psb_err_unit,'("and you have chosen psb_dupl_err_ ")') case(psb_err_invalid_input_format_) write(psb_err_unit,'("Invalid input format ",a3)')& & a_e_d(1:3) case(psb_err_unsupported_format_) write(psb_err_unit,'("Format ",a3," not yet supported here")')& &a_e_d(1:3) case(psb_err_format_unknown_) write(psb_err_unit,'("Format ",a3," is unknown")')& & a_e_d(1:3) case(psb_err_iarray_outside_bounds_) write(psb_err_unit,'("indices in input array are not within problem dimension ",2(i0,2x))')& &i_e_d(1:2) case(psb_err_iarray_outside_process_) write(psb_err_unit,'("indices in input array are not belonging to the calling process ",i0)')& & i_e_d(1) case(psb_err_forgot_geall_) write(psb_err_unit,'("To call this routine you must first call psb_geall on the same matrix")') case(psb_err_forgot_spall_) write(psb_err_unit,'("To call this routine you must first call psb_spall on the same matrix")') case(psb_err_wrong_ins_) write(0,'("Something went wrong before this call to ",a,", probably in cdins/spins")')& & trim(r_name) case(psb_err_iarg_mbeeiarra_i_) write(psb_err_unit,& & '("Input argument n. ",i0," must be equal to entry n. ",i0," in array input argument n.",i0)') & & i_e_d(1),i_e_d(4),i_e_d(3) write(psb_err_unit,'("Current values are ",i0," != ",i0)')i_e_d(2), i_e_d(5) case(psb_err_mpi_error_) write(psb_err_unit,'("MPI error:",i0)')i_e_d(1) case(psb_err_parm_differs_among_procs_) write(psb_err_unit,'("Parameter n. ",i0," must be equal on all processes. ",i0)')i_e_d(1) case(psb_err_entry_out_of_bounds_) write(psb_err_unit,'("Entry n. ",i0," out of ",i0," should be between 1 and ",i0," but is ",i0)')& & i_e_d(1),i_e_d(3),i_e_d(4),i_e_d(2) case(psb_err_inconsistent_index_lists_) write(psb_err_unit,'("Index lists are inconsistent: some indices are orphans")') case(psb_err_partfunc_toomuchprocs_) write(psb_err_unit,& &'("partition function passed as input argument n. ",i0," returns number of processes")')& &i_e_d(1) write(psb_err_unit,& & '("greater than No of grid s processes on global point ",i0,". Actual number of grid s ")')& &i_e_d(4) write(psb_err_unit,'("processes is ",i0,", number returned is ",i0)')i_e_d(2),i_e_d(3) case(psb_err_partfunc_toofewprocs_) write(psb_err_unit,'("partition function passed as input argument n. ",i0," returns number of processes")')& &i_e_d(1) write(psb_err_unit,'("less or equal to 0 on global point ",i0,". Number returned is ",i0)')& &i_e_d(3),i_e_d(2) case(psb_err_partfunc_wrong_pid_) write(psb_err_unit,& &'("partition function passed as input argument n. ",i0," returns wrong processes identifier")')& & i_e_d(1) write(psb_err_unit,'("on global point ",i0,". Current value returned is : ",i0)')& & i_e_d(3),i_e_d(2) case(psb_err_no_optional_arg_) write(psb_err_unit,'("One of the optional arguments ",a," must be present")')& & trim(a_e_d) case(psb_err_arg_m_required_) write(psb_err_unit,'("Argument M is required when argument PARTS is specified")') case(psb_err_spmat_invalid_state_) write(psb_err_unit,& & '("Sparse Matrix and descriptors are in an invalid state for this subroutine call: ",i0)')& &i_e_d(1) case(psb_err_missing_override_method_) write(psb_err_unit,& & '("Base class method ",a," called: the class for ",a," is missing an overriding implementation")')& & trim(r_name), trim(a_e_d) case(psb_err_invalid_dynamic_type_) write(psb_err_unit,'("input argument n. ",i0," has a dynamic type not allowed here.")')& & i_e_d(1) case (psb_err_rectangular_mat_unsupported_) write(psb_err_unit,& &'("This routine does not support rectangular matrices: ",i0, " /= ",i0)') & & i_e_d(1), i_e_d(2) case (psb_err_invalid_mat_state_) write(psb_err_unit,'("Invalid state for sparse matrix")') case (psb_err_invalid_cd_state_) write(psb_err_unit,'("Invalid state for communication descriptor")') case (psb_err_invalid_a_and_cd_state_) write(psb_err_unit,'("Invalid combined state for A and DESC_A")') case (psb_err_invalid_vect_state_) write(psb_err_unit,'("Invalid state for vector")') case(1125:1999) write(psb_err_unit,'("computational error. code: ",i0)')err_c case(psb_err_context_error_) write(0,'("Parallel context error. Number of processes=-1")') case(psb_err_initerror_neugh_procs_) write(psb_err_unit,& & '("Initialization error: not enough processes available in the parallel environment")') case(psb_err_invalid_matrix_input_state_) write(psb_err_unit,'("Invalid input state for matrix.")') case(psb_err_input_no_regen_) write(psb_err_unit,'("Input state for matrix is not adequate for regeneration.")') case (2233:2999) write(psb_err_unit,'("resource error. code: ",i0)')err_c case(3000:3009) write(psb_err_unit,& & '("sparse matrix representation ",a3," not yet implemented")')& &a_e_d(1:3) case(psb_err_lld_case_not_implemented_) write(psb_err_unit,& &'("Case lld not equal matrix_data[N_COL_] is not yet implemented.")') case(psb_err_transpose_unsupported_) write(psb_err_unit,& & '("transpose option for sparse matrix representation ",a3," not implemented")')& & a_e_d(1:3) case(psb_err_transpose_c_unsupported_) write(psb_err_unit,'("Case trans = C is not yet implemented.")') case(psb_err_transpose_not_n_unsupported_) write(psb_err_unit,'("Case trans /= N is not yet implemented.")') case(psb_err_only_unit_diag_) write(psb_err_unit,'("Only unit diagonal so far for triangular matrices. ")') case(3023) write(psb_err_unit,'("Cases DESCRA(1:1)=S DESCRA(1:1)=T not yet implemented. ")') case(3024) write(psb_err_unit,'("Cases DESCRA(1:1)=G not yet implemented. ")') case(psb_err_ja_nix_ia_niy_unsupported_) write(psb_err_unit,'("Case ja /= ix or ia/=iy is not yet implemented.")') case(psb_err_ix_n1_iy_n1_unsupported_) write(psb_err_unit,'("Case ix /= 1 or iy /= 1 is not yet implemented.")') case(3050) write(psb_err_unit,'("Case ix /= iy is not yet implemented.")') case(3060) write(psb_err_unit,'("Case ix /= 1 is not yet implemented.")') case(3070) write(psb_err_unit,& & '("This operation is only implemented with no overlap.")') case(3080) write(psb_err_unit,& & '("Decompostion type ",i0," not yet supported.")')& & i_e_d(1) case(3090) write(psb_err_unit,'("Insert matrix mode not yet implemented.")') case(3100) write(psb_err_unit,& & '("Error on index. Element has not been inserted")') write(psb_err_unit,& & '("local index is: ",i0," and global index is:",i0)')& & i_e_d(1:2) case(psb_err_input_matrix_unassembled_) write(psb_err_unit,& &'("Before you call this routine, you must assembly sparse matrix")') case(3111) write(psb_err_unit,& & '("Before you call this routine, you must initialize the preconditioner")') case(3112) write(psb_err_unit,& & '("Before you call this routine, you must build the preconditioner")') case(3113:3998) write(psb_err_unit,'("miscellaneus error. code: ",i0)')err_c case(psb_err_missing_aux_lib_) write(psb_err_unit,& &'("This method requires an external support library.")') write(psb_err_unit,& &'("Fix configure and rebuild the software.")') case(psb_err_alloc_dealloc_) write(psb_err_unit,'("Allocation/deallocation error")') case(psb_err_internal_error_) write(psb_err_unit,'("Internal error: ",a)') & & trim(a_e_d) case(psb_err_from_subroutine_) write(psb_err_unit,'("Error from call to subroutine ",a)')& & trim(a_e_d) case(psb_err_from_subroutine_non_) write(psb_err_unit,'("Error from call to a subroutine ")') case(psb_err_from_subroutine_i_) write(psb_err_unit,'("Error ",i0," from call to a subroutine ")')& & i_e_d(1) case(psb_err_from_subroutine_ai_) write(psb_err_unit,'("Error from call to subroutine ",a," ",i0)')& & trim(a_e_d),i_e_d(1) case(psb_err_alloc_request_) write(psb_err_unit,& & '("Error on allocation request for ",i0," items of type ",a)')& & i_e_d(1),trim(a_e_d) case(4110) write(psb_err_unit,& & '("Error ",i0," from call to an external package in subroutine ",a)')& &i_e_d(1),trim(a_e_d) case (psb_err_invalid_istop_) write(psb_err_unit,'("Invalid ISTOP: ",i0)')i_e_d(1) case (5002) write(psb_err_unit,'("Invalid PREC: ",i0)')i_e_d(1) case (5003) write(psb_err_unit,'("Invalid PREC: ",a3)')a_e_d(1:3) case default write(psb_err_unit,'("unknown error (",i0,") in subroutine ",a)')& & err_c,trim(r_name) write(psb_err_unit,'(5(i0,2x))') i_e_d write(psb_err_unit,'(a)') trim(a_e_d) end select end subroutine psb_errmsg end module psb_error_mod