*nix Documentation Project
·  Home
 +   man pages
·  Linux HOWTOs
·  FreeBSD Tips
·  *niX Forums

  man pages->IRIX man pages -> complib/zgbcon (3)              
Title
Content
Arch
Section
 

Contents


ZGBCON(3F)							    ZGBCON(3F)


NAME    [Toc]    [Back]

     ZGBCON - estimate the reciprocal of the condition number of a complex
     general band matrix A, in either the 1-norm or the	infinity-norm,

SYNOPSIS    [Toc]    [Back]

     SUBROUTINE	ZGBCON(	NORM, N, KL, KU, AB, LDAB, IPIV, ANORM,	RCOND, WORK,
			RWORK, INFO )

	 CHARACTER	NORM

	 INTEGER	INFO, KL, KU, LDAB, N

	 DOUBLE		PRECISION ANORM, RCOND

	 INTEGER	IPIV( *	)

	 DOUBLE		PRECISION RWORK( * )

	 COMPLEX*16	AB( LDAB, * ), WORK( * )

PURPOSE    [Toc]    [Back]

     ZGBCON estimates the reciprocal of	the condition number of	a complex
     general band matrix A, in either the 1-norm or the	infinity-norm, using
     the LU factorization computed by ZGBTRF.

     An	estimate is obtained for norm(inv(A)), and the reciprocal of the
     condition number is computed as
	RCOND =	1 / ( norm(A) *	norm(inv(A)) ).

ARGUMENTS    [Toc]    [Back]

     NORM    (input) CHARACTER*1
	     Specifies whether the 1-norm condition number or the infinitynorm
 condition number is required:
	     = '1' or 'O':  1-norm;
	     = 'I':	    Infinity-norm.

     N	     (input) INTEGER
	     The order of the matrix A.	 N >= 0.

     KL	     (input) INTEGER
	     The number	of subdiagonals	within the band	of A.  KL >= 0.

     KU	     (input) INTEGER
	     The number	of superdiagonals within the band of A.	 KU >= 0.

     AB	     (input) COMPLEX*16	array, dimension (LDAB,N)
	     Details of	the LU factorization of	the band matrix	A, as computed
	     by	ZGBTRF.	 U is stored as	an upper triangular band matrix	with
	     KL+KU superdiagonals in rows 1 to KL+KU+1,	and the	multipliers
	     used during the factorization are stored in rows KL+KU+2 to
	     2*KL+KU+1.



									Page 1






ZGBCON(3F)							    ZGBCON(3F)



     LDAB    (input) INTEGER
	     The leading dimension of the array	AB.  LDAB >= 2*KL+KU+1.

     IPIV    (input) INTEGER array, dimension (N)
	     The pivot indices;	for 1 <= i <= N, row i of the matrix was
	     interchanged with row IPIV(i).

     ANORM   (input) DOUBLE PRECISION
	     If	NORM = '1' or 'O', the 1-norm of the original matrix A.	 If
	     NORM = 'I', the infinity-norm of the original matrix A.

     RCOND   (output) DOUBLE PRECISION
	     The reciprocal of the condition number of the matrix A, computed
	     as	RCOND =	1/(norm(A) * norm(inv(A))).

     WORK    (workspace) COMPLEX*16 array, dimension (2*N)

     RWORK   (workspace) DOUBLE	PRECISION array, dimension (N)

     INFO    (output) INTEGER
	     = 0:  successful exit
	     < 0: if INFO = -i,	the i-th argument had an illegal value
ZGBCON(3F)							    ZGBCON(3F)


NAME    [Toc]    [Back]

     ZGBCON - estimate the reciprocal of the condition number of a complex
     general band matrix A, in either the 1-norm or the	infinity-norm,

SYNOPSIS    [Toc]    [Back]

     SUBROUTINE	ZGBCON(	NORM, N, KL, KU, AB, LDAB, IPIV, ANORM,	RCOND, WORK,
			RWORK, INFO )

	 CHARACTER	NORM

	 INTEGER	INFO, KL, KU, LDAB, N

	 DOUBLE		PRECISION ANORM, RCOND

	 INTEGER	IPIV( *	)

	 DOUBLE		PRECISION RWORK( * )

	 COMPLEX*16	AB( LDAB, * ), WORK( * )

PURPOSE    [Toc]    [Back]

     ZGBCON estimates the reciprocal of	the condition number of	a complex
     general band matrix A, in either the 1-norm or the	infinity-norm, using
     the LU factorization computed by ZGBTRF.

     An	estimate is obtained for norm(inv(A)), and the reciprocal of the
     condition number is computed as
	RCOND =	1 / ( norm(A) *	norm(inv(A)) ).

ARGUMENTS    [Toc]    [Back]

     NORM    (input) CHARACTER*1
	     Specifies whether the 1-norm condition number or the infinitynorm
 condition number is required:
	     = '1' or 'O':  1-norm;
	     = 'I':	    Infinity-norm.

     N	     (input) INTEGER
	     The order of the matrix A.	 N >= 0.

     KL	     (input) INTEGER
	     The number	of subdiagonals	within the band	of A.  KL >= 0.

     KU	     (input) INTEGER
	     The number	of superdiagonals within the band of A.	 KU >= 0.

     AB	     (input) COMPLEX*16	array, dimension (LDAB,N)
	     Details of	the LU factorization of	the band matrix	A, as computed
	     by	ZGBTRF.	 U is stored as	an upper triangular band matrix	with
	     KL+KU superdiagonals in rows 1 to KL+KU+1,	and the	multipliers
	     used during the factorization are stored in rows KL+KU+2 to
	     2*KL+KU+1.



									Page 1






ZGBCON(3F)							    ZGBCON(3F)



     LDAB    (input) INTEGER
	     The leading dimension of the array	AB.  LDAB >= 2*KL+KU+1.

     IPIV    (input) INTEGER array, dimension (N)
	     The pivot indices;	for 1 <= i <= N, row i of the matrix was
	     interchanged with row IPIV(i).

     ANORM   (input) DOUBLE PRECISION
	     If	NORM = '1' or 'O', the 1-norm of the original matrix A.	 If
	     NORM = 'I', the infinity-norm of the original matrix A.

     RCOND   (output) DOUBLE PRECISION
	     The reciprocal of the condition number of the matrix A, computed
	     as	RCOND =	1/(norm(A) * norm(inv(A))).

     WORK    (workspace) COMPLEX*16 array, dimension (2*N)

     RWORK   (workspace) DOUBLE	PRECISION array, dimension (N)

     INFO    (output) INTEGER
	     = 0:  successful exit
	     < 0: if INFO = -i,	the i-th argument had an illegal value


									PPPPaaaaggggeeee 2222
[ Back ]
 Similar pages
Name OS Title
dtbcon IRIX band matrix A, in either the 1-norm or the infinity-norm
ctbcon IRIX band matrix A, in either the 1-norm or the infinity-norm
stbcon IRIX band matrix A, in either the 1-norm or the infinity-norm
ztbcon IRIX band matrix A, in either the 1-norm or the infinity-norm
cgecon IRIX complex matrix A, in either the 1-norm or the infinity-norm, using the LU factorization computed by CGETRF
dgecon IRIX real matrix A, in either the 1-norm or the infinity-norm, using the LU factorization computed by DGETRF
zgecon IRIX complex matrix A, in either the 1-norm or the infinity-norm, using the LU factorization computed by ZGETRF
sgecon IRIX real matrix A, in either the 1-norm or the infinity-norm, using the LU factorization computed by SGETRF
dlangt IRIX return the value of the one norm, or the Frobenius norm, or the infinity norm, or the element of largest absol
dlange IRIX return the value of the one norm, or the Frobenius norm, or the infinity norm, or the element of largest absol
Copyright © 2004-2005 DeniX Solutions SRL
newsletter delivery service