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

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

Contents


CLASCL(3F)							    CLASCL(3F)


NAME    [Toc]    [Back]

     CLASCL - multiplie	the M by N complex matrix A by the real	scalar
     CTO/CFROM

SYNOPSIS    [Toc]    [Back]

     SUBROUTINE	CLASCL(	TYPE, KL, KU, CFROM, CTO, M, N,	A, LDA,	INFO )

	 CHARACTER	TYPE

	 INTEGER	INFO, KL, KU, LDA, M, N

	 REAL		CFROM, CTO

	 COMPLEX	A( LDA,	* )

PURPOSE    [Toc]    [Back]

     CLASCL multiplies the M by	N complex matrix A by the real scalar
     CTO/CFROM.	 This is done without over/underflow as	long as	the final
     result CTO*A(I,J)/CFROM does not over/underflow. TYPE specifies that A
     may be full, upper	triangular, lower triangular, upper Hessenberg,	or
     banded.

ARGUMENTS    [Toc]    [Back]

     TYPE    (input) CHARACTER*1
	     TYPE indices the storage type of the input	matrix.	 = 'G':	 A is
	     a full matrix.
	     = 'L':  A is a lower triangular matrix.
	     = 'U':  A is an upper triangular matrix.
	     = 'H':  A is an upper Hessenberg matrix.
	     = 'B':  A is a symmetric band matrix with lower bandwidth KL and
	     upper bandwidth KU	and with the only the lower half stored.  =
	     'Q':  A is	a symmetric band matrix	with lower bandwidth KL	and
	     upper bandwidth KU	and with the only the upper half stored.  =
	     'Z':  A is	a band matrix with lower bandwidth KL and upper
	     bandwidth KU.

     KL	     (input) INTEGER
	     The lower bandwidth of A.	Referenced only	if TYPE	= 'B',

     KU	     (input) INTEGER
	     The upper bandwidth of A.	Referenced only	if TYPE	= 'B',

     CFROM   (input) REAL
	     CTO     (input) REAL The matrix A is multiplied by	CTO/CFROM.
	     A(I,J) is computed	without	over/underflow if the final result
	     CTO*A(I,J)/CFROM can be represented without over/underflow.
	     CFROM must	be nonzero.

     M	     (input) INTEGER
	     The number	of rows	of the matrix A.  M >= 0.




									Page 1






CLASCL(3F)							    CLASCL(3F)



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

     A	     (input/output) COMPLEX array, dimension (LDA,M)
	     The matrix	to be multiplied by CTO/CFROM.	See TYPE for the
	     storage type.

     LDA     (input) INTEGER
	     The leading dimension of the array	A.  LDA	>= max(1,M).

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


NAME    [Toc]    [Back]

     CLASCL - multiplie	the M by N complex matrix A by the real	scalar
     CTO/CFROM

SYNOPSIS    [Toc]    [Back]

     SUBROUTINE	CLASCL(	TYPE, KL, KU, CFROM, CTO, M, N,	A, LDA,	INFO )

	 CHARACTER	TYPE

	 INTEGER	INFO, KL, KU, LDA, M, N

	 REAL		CFROM, CTO

	 COMPLEX	A( LDA,	* )

PURPOSE    [Toc]    [Back]

     CLASCL multiplies the M by	N complex matrix A by the real scalar
     CTO/CFROM.	 This is done without over/underflow as	long as	the final
     result CTO*A(I,J)/CFROM does not over/underflow. TYPE specifies that A
     may be full, upper	triangular, lower triangular, upper Hessenberg,	or
     banded.

ARGUMENTS    [Toc]    [Back]

     TYPE    (input) CHARACTER*1
	     TYPE indices the storage type of the input	matrix.	 = 'G':	 A is
	     a full matrix.
	     = 'L':  A is a lower triangular matrix.
	     = 'U':  A is an upper triangular matrix.
	     = 'H':  A is an upper Hessenberg matrix.
	     = 'B':  A is a symmetric band matrix with lower bandwidth KL and
	     upper bandwidth KU	and with the only the lower half stored.  =
	     'Q':  A is	a symmetric band matrix	with lower bandwidth KL	and
	     upper bandwidth KU	and with the only the upper half stored.  =
	     'Z':  A is	a band matrix with lower bandwidth KL and upper
	     bandwidth KU.

     KL	     (input) INTEGER
	     The lower bandwidth of A.	Referenced only	if TYPE	= 'B',

     KU	     (input) INTEGER
	     The upper bandwidth of A.	Referenced only	if TYPE	= 'B',

     CFROM   (input) REAL
	     CTO     (input) REAL The matrix A is multiplied by	CTO/CFROM.
	     A(I,J) is computed	without	over/underflow if the final result
	     CTO*A(I,J)/CFROM can be represented without over/underflow.
	     CFROM must	be nonzero.

     M	     (input) INTEGER
	     The number	of rows	of the matrix A.  M >= 0.




									Page 1






CLASCL(3F)							    CLASCL(3F)



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

     A	     (input/output) COMPLEX array, dimension (LDA,M)
	     The matrix	to be multiplied by CTO/CFROM.	See TYPE for the
	     storage type.

     LDA     (input) INTEGER
	     The leading dimension of the array	A.  LDA	>= max(1,M).

     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
slascl IRIX multiplie the M by N real matrix A by the real scalar CTO/CFROM
dlascl IRIX multiplie the M by N real matrix A by the real scalar CTO/CFROM
zdrscl IRIX multiplie an n-element complex vector x by the real scalar 1/a
zsrscl IRIX multiplie an n-element complex vector x by the real scalar 1/a
csrscl IRIX multiplie an n-element complex vector x by the real scalar 1/a
srscl IRIX multiplie an n-element real vector x by the real scalar 1/a
drscl IRIX multiplie an n-element real vector x by the real scalar 1/a
HTRIDI IRIX EISPACK routine. This subroutine reduces a COMPLEX HERMITIAN matrix to a real symmetric tridiagonal matrix usi
zlabrd IRIX reduce the first NB rows and columns of a complex general m by n matrix A to upper or lower real bidiagonal fo
clabrd IRIX reduce the first NB rows and columns of a complex general m by n matrix A to upper or lower real bidiagonal fo
Copyright © 2004-2005 DeniX Solutions SRL
newsletter delivery service