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

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

Contents


ZTREXC(3F)							    ZTREXC(3F)


NAME    [Toc]    [Back]

     ZTREXC - reorder the Schur	factorization of a complex matrix A =
     Q*T*Q**H, so that the diagonal element of T with row index	IFST is	moved
     to	row ILST

SYNOPSIS    [Toc]    [Back]

     SUBROUTINE	ZTREXC(	COMPQ, N, T, LDT, Q, LDQ, IFST,	ILST, INFO )

	 CHARACTER	COMPQ

	 INTEGER	IFST, ILST, INFO, LDQ, LDT, N

	 COMPLEX*16	Q( LDQ,	* ), T(	LDT, * )

PURPOSE    [Toc]    [Back]

     ZTREXC reorders the Schur factorization of	a complex matrix A = Q*T*Q**H,
     so	that the diagonal element of T with row	index IFST is moved to row
     ILST.

     The Schur form T is reordered by a	unitary	similarity transformation
     Z**H*T*Z, and optionally the matrix Q of Schur vectors is updated by
     postmultplying it with Z.

ARGUMENTS    [Toc]    [Back]

     COMPQ   (input) CHARACTER*1
	     = 'V':  update the	matrix Q of Schur vectors;
	     = 'N':  do	not update Q.

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

     T	     (input/output) COMPLEX*16 array, dimension	(LDT,N)
	     On	entry, the upper triangular matrix T.  On exit,	the reordered
	     upper triangular matrix.

     LDT     (input) INTEGER
	     The leading dimension of the array	T. LDT >= max(1,N).

     Q	     (input/output) COMPLEX*16 array, dimension	(LDQ,N)
	     On	entry, if COMPQ	= 'V', the matrix Q of Schur vectors.  On
	     exit, if COMPQ = 'V', Q has been postmultiplied by	the unitary
	     transformation matrix Z which reorders T.	If COMPQ = 'N',	Q is
	     not referenced.

     LDQ     (input) INTEGER
	     The leading dimension of the array	Q.  LDQ	>= max(1,N).

     IFST    (input) INTEGER
	     ILST    (input) INTEGER Specify the reordering of the diagonal
	     elements of T:  The element with row index	IFST is	moved to row
	     ILST by a sequence	of transpositions between adjacent elements.



									Page 1






ZTREXC(3F)							    ZTREXC(3F)



	     1 <= IFST <= N; 1 <= ILST <= N.

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


NAME    [Toc]    [Back]

     ZTREXC - reorder the Schur	factorization of a complex matrix A =
     Q*T*Q**H, so that the diagonal element of T with row index	IFST is	moved
     to	row ILST

SYNOPSIS    [Toc]    [Back]

     SUBROUTINE	ZTREXC(	COMPQ, N, T, LDT, Q, LDQ, IFST,	ILST, INFO )

	 CHARACTER	COMPQ

	 INTEGER	IFST, ILST, INFO, LDQ, LDT, N

	 COMPLEX*16	Q( LDQ,	* ), T(	LDT, * )

PURPOSE    [Toc]    [Back]

     ZTREXC reorders the Schur factorization of	a complex matrix A = Q*T*Q**H,
     so	that the diagonal element of T with row	index IFST is moved to row
     ILST.

     The Schur form T is reordered by a	unitary	similarity transformation
     Z**H*T*Z, and optionally the matrix Q of Schur vectors is updated by
     postmultplying it with Z.

ARGUMENTS    [Toc]    [Back]

     COMPQ   (input) CHARACTER*1
	     = 'V':  update the	matrix Q of Schur vectors;
	     = 'N':  do	not update Q.

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

     T	     (input/output) COMPLEX*16 array, dimension	(LDT,N)
	     On	entry, the upper triangular matrix T.  On exit,	the reordered
	     upper triangular matrix.

     LDT     (input) INTEGER
	     The leading dimension of the array	T. LDT >= max(1,N).

     Q	     (input/output) COMPLEX*16 array, dimension	(LDQ,N)
	     On	entry, if COMPQ	= 'V', the matrix Q of Schur vectors.  On
	     exit, if COMPQ = 'V', Q has been postmultiplied by	the unitary
	     transformation matrix Z which reorders T.	If COMPQ = 'N',	Q is
	     not referenced.

     LDQ     (input) INTEGER
	     The leading dimension of the array	Q.  LDQ	>= max(1,N).

     IFST    (input) INTEGER
	     ILST    (input) INTEGER Specify the reordering of the diagonal
	     elements of T:  The element with row index	IFST is	moved to row
	     ILST by a sequence	of transpositions between adjacent elements.



									Page 1






ZTREXC(3F)							    ZTREXC(3F)



	     1 <= IFST <= N; 1 <= ILST <= 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
ztrsen IRIX reorder the Schur factorization of a complex matrix A = Q*T*Q**H, so that a selected cluster of eigenvalues ap
ctrsen IRIX reorder the Schur factorization of a complex matrix A = Q*T*Q**H, so that a selected cluster of eigenvalues ap
dtrexc IRIX reorder the real Schur factorization of a real matrix A = Q*T*Q**T, so that the diagonal block of T with row i
strexc IRIX reorder the real Schur factorization of a real matrix A = Q*T*Q**T, so that the diagonal block of T with row i
strsen IRIX reorder the real Schur factorization of a real matrix A = Q*T*Q**T, so that a selected cluster of eigenvalues
dtrsen IRIX reorder the real Schur factorization of a real matrix A = Q*T*Q**T, so that a selected cluster of eigenvalues
dlanv2 IRIX compute the Schur factorization of a real 2-by-2 nonsymmetric matrix in standard form
slanv2 IRIX compute the Schur factorization of a real 2-by-2 nonsymmetric matrix in standard form
dlasq2 IRIX DLASQ2 computes the singular values of a real N-by-N unreduced bidiagonal matrix with squared diagonal element
slasq2 IRIX SLASQ2 computes the singular values of a real N-by-N unreduced bidiagonal matrix with squared diagonal element
Copyright © 2004-2005 DeniX Solutions SRL
newsletter delivery service