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

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

Contents


SLASET(3F)							    SLASET(3F)


NAME    [Toc]    [Back]

     SLASET - initialize an m-by-n matrix A to BETA on the diagonal and	ALPHA
     on	the offdiagonals

SYNOPSIS    [Toc]    [Back]

     SUBROUTINE	SLASET(	UPLO, M, N, ALPHA, BETA, A, LDA	)

	 CHARACTER	UPLO

	 INTEGER	LDA, M,	N

	 REAL		ALPHA, BETA

	 REAL		A( LDA,	* )

PURPOSE    [Toc]    [Back]

     SLASET initializes	an m-by-n matrix A to BETA on the diagonal and ALPHA
     on	the offdiagonals.

ARGUMENTS    [Toc]    [Back]

     UPLO    (input) CHARACTER*1
	     Specifies the part	of the matrix A	to be set.  = 'U':	Upper
	     triangular	part is	set; the strictly lower	triangular part	of A
	     is	not changed.  =	'L':	  Lower	triangular part	is set;	the
	     strictly upper triangular part of A is not	changed.  Otherwise:
	     All of the	matrix A is set.

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

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

     ALPHA   (input) REAL
	     The constant to which the offdiagonal elements are	to be set.

     BETA    (input) REAL
	     The constant to which the diagonal	elements are to	be set.

     A	     (input/output) REAL array,	dimension (LDA,N)
	     On	exit, the leading m-by-n submatrix of A	is set as follows:

	     if	UPLO = 'U', A(i,j) = ALPHA, 1<=i<=j-1, 1<=j<=n,	if UPLO	= 'L',
	     A(i,j) = ALPHA, j+1<=i<=m,	1<=j<=n, otherwise,	A(i,j) =
	     ALPHA, 1<=i<=m, 1<=j<=n, i.ne.j,

	     and, for all UPLO,	A(i,i) = BETA, 1<=i<=min(m,n).

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


NAME    [Toc]    [Back]

     SLASET - initialize an m-by-n matrix A to BETA on the diagonal and	ALPHA
     on	the offdiagonals

SYNOPSIS    [Toc]    [Back]

     SUBROUTINE	SLASET(	UPLO, M, N, ALPHA, BETA, A, LDA	)

	 CHARACTER	UPLO

	 INTEGER	LDA, M,	N

	 REAL		ALPHA, BETA

	 REAL		A( LDA,	* )

PURPOSE    [Toc]    [Back]

     SLASET initializes	an m-by-n matrix A to BETA on the diagonal and ALPHA
     on	the offdiagonals.

ARGUMENTS    [Toc]    [Back]

     UPLO    (input) CHARACTER*1
	     Specifies the part	of the matrix A	to be set.  = 'U':	Upper
	     triangular	part is	set; the strictly lower	triangular part	of A
	     is	not changed.  =	'L':	  Lower	triangular part	is set;	the
	     strictly upper triangular part of A is not	changed.  Otherwise:
	     All of the	matrix A is set.

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

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

     ALPHA   (input) REAL
	     The constant to which the offdiagonal elements are	to be set.

     BETA    (input) REAL
	     The constant to which the diagonal	elements are to	be set.

     A	     (input/output) REAL array,	dimension (LDA,N)
	     On	exit, the leading m-by-n submatrix of A	is set as follows:

	     if	UPLO = 'U', A(i,j) = ALPHA, 1<=i<=j-1, 1<=j<=n,	if UPLO	= 'L',
	     A(i,j) = ALPHA, j+1<=i<=m,	1<=j<=n, otherwise,	A(i,j) =
	     ALPHA, 1<=i<=m, 1<=j<=n, i.ne.j,

	     and, for all UPLO,	A(i,i) = BETA, 1<=i<=min(m,n).

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


									PPPPaaaaggggeeee 1111
[ Back ]
 Similar pages
Name OS Title
claset IRIX initialize a 2-D array A to BETA on the diagonal and ALPHA on the offdiagonals
zlaset IRIX initialize a 2-D array A to BETA on the diagonal and ALPHA on the offdiagonals
zlagtm IRIX perform a matrix-vector product of the form B := alpha * A * X + beta * B where A is a tridiagonal matrix of o
slagtm IRIX perform a matrix-vector product of the form B := alpha * A * X + beta * B where A is a tridiagonal matrix of o
dlagtm IRIX perform a matrix-vector product of the form B := alpha * A * X + beta * B where A is a tridiagonal matrix of o
clagtm IRIX perform a matrix-vector product of the form B := alpha * A * X + beta * B where A is a tridiagonal matrix of o
gemv IRIX BLAS Level Two Matrix-Vector Product FORTRAN 77 SYNOPSIS subroutine dgemv( trans,m,n,alpha,a,lda,x,incx,beta,y
cgegv IRIX B, the generalized eigenvalues (alpha, beta), and optionally,
zgegv IRIX B, the generalized eigenvalues (alpha, beta), and optionally,
slarfg IRIX generate a real elementary reflector H of order n, such that H * ( alpha ) = ( beta ), H' * H = I
Copyright © 2004-2005 DeniX Solutions SRL
newsletter delivery service