XERBLA Subroutine

subroutine XERBLA(SRNAME, INFO)

Uses

\brief \b XERBLA \par Purpose:

\verbatim

XERBLA is an error handler for the LAPACK routines. It is called by an LAPACK routine if an input parameter has an invalid value. A message is printed and execution stops.

Installers may consider modifying the STOP statement in order to call system-specific exception-handling facilities. \endverbatim \param[in] SRNAME \verbatim SRNAME is CHARACTER() The name of the routine which called XERBLA. \endverbatim

\param[in] INFO \verbatim INFO is INTEGER The position of the invalid parameter in the parameter list of the calling routine. \endverbatim \author Univ. of Tennessee \author Univ. of California Berkeley \author Univ. of Colorado Denver \author NAG Ltd. \date December 2016 \ingroup aux_blas

Arguments

Type IntentOptional Attributes Name
character(len=*), intent(in) :: SRNAME
integer, intent(in) :: INFO

Contents

Source Code


Source Code

subroutine XERBLA( SRNAME, INFO )
! COMMENT --file xerbla.3m_blas.man
!> \brief \b XERBLA
!
!  =========== DOCUMENTATION ===========
!
! Online html documentation available at
!            http://www.netlib.org/lapack/explore-html/
!
!  Definition:
!  ===========
!
!       SUBROUTINE XERBLA( SRNAME, INFO )
!
!       .. Scalar Arguments ..
!       CHARACTER*(*)      SRNAME
!       INTEGER            INFO
!       ..
!
!
!> \par Purpose:
!  =============
!>
!> \verbatim
!>
!> XERBLA  is an error handler for the LAPACK routines.
!> It is called by an LAPACK routine if an input parameter has an
!> invalid value.  A message is printed and execution stops.
!>
!> Installers may consider modifying the STOP statement in order to
!> call system-specific exception-handling facilities.
!> \endverbatim
!
!  Arguments:
!  ==========
!
!> \param[in] SRNAME
!> \verbatim
!>          SRNAME is CHARACTER*(*)
!>          The name of the routine which called XERBLA.
!> \endverbatim
!>
!> \param[in] INFO
!> \verbatim
!>          INFO is INTEGER
!>          The position of the invalid parameter in the parameter list
!>          of the calling routine.
!> \endverbatim
!
!  Authors:
!  ========
!
!> \author Univ. of Tennessee
!> \author Univ. of California Berkeley
!> \author Univ. of Colorado Denver
!> \author NAG Ltd.
!
!> \date December 2016
!
!> \ingroup aux_blas
!
!  =====================================================================
!
!  -- Reference BLAS level1 routine (version 3.7.0) --
!  -- Reference BLAS is a software package provided by Univ. of Tennessee,    --
!  -- Univ. of California Berkeley, Univ. of Colorado Denver and NAG Ltd..--
!     December 2016
!
!     .. Scalar Arguments ..
!     ..
!
! =====================================================================
!
!     .. Intrinsic Functions ..
!     ..
!     .. Executable Statements ..
!
!
!
!
!     End of XERBLA
!
! END
use M_blas, only : xerbla_=>XERBLA
implicit none
      CHARACTER(len=*),intent(in) :: SRNAME
      INTEGER,intent(in)          :: INFO
    call XERBLA_( SRNAME, INFO )
END SUBROUTINE XERBLA