ctpmv man page on OpenIndiana

Man page or keyword search:  
man Server   20441 pages
apropos Keyword Search (all sections)
Output format
OpenIndiana logo
[printable version]

ctpmv(3P)		    Sun Performance Library		     ctpmv(3P)

NAME
       ctpmv - perform one of the matrix-vector operations   x := A*x, or x :=
       A'*x, or x := conjg( A' )*x

SYNOPSIS
       SUBROUTINE CTPMV(UPLO, TRANSA, DIAG, N, A, Y, INCY)

       CHARACTER * 1 UPLO, TRANSA, DIAG
       COMPLEX A(*), Y(*)
       INTEGER N, INCY

       SUBROUTINE CTPMV_64(UPLO, TRANSA, DIAG, N, A, Y, INCY)

       CHARACTER * 1 UPLO, TRANSA, DIAG
       COMPLEX A(*), Y(*)
       INTEGER*8 N, INCY

   F95 INTERFACE
       SUBROUTINE TPMV(UPLO, [TRANSA], DIAG, [N], A, Y, [INCY])

       CHARACTER(LEN=1) :: UPLO, TRANSA, DIAG
       COMPLEX, DIMENSION(:) :: A, Y
       INTEGER :: N, INCY

       SUBROUTINE TPMV_64(UPLO, [TRANSA], DIAG, [N], A, Y, [INCY])

       CHARACTER(LEN=1) :: UPLO, TRANSA, DIAG
       COMPLEX, DIMENSION(:) :: A, Y
       INTEGER(8) :: N, INCY

   C INTERFACE
       #include <sunperf.h>

       void ctpmv(char uplo, char transa, char diag, int n, complex  *a,  com‐
		 plex *y, int incy);

       void  ctpmv_64(char  uplo,  char transa, char diag, long n, complex *a,
		 complex *y, long incy);

PURPOSE
       ctpmv performs one of the matrix-vector operations x := A*x,  or	 x  :=
       A'*x, or x := conjg( A' )*x where x is an n element vector and  A is an
       n by n unit, or non-unit, upper or lower triangular matrix, supplied in
       packed form.

ARGUMENTS
       UPLO (input)
		 On  entry,  UPLO  specifies whether the matrix is an upper or
		 lower triangular matrix as follows:

		 UPLO = 'U' or 'u'   A is an upper triangular matrix.

		 UPLO = 'L' or 'l'   A is a lower triangular matrix.

		 Unchanged on exit.

       TRANSA (input)
		 On entry, TRANSA specifies the operation to be	 performed  as
		 follows:

		 TRANSA = 'N' or 'n'   x := A*x.

		 TRANSA = 'T' or 't'   x := A'*x.

		 TRANSA = 'C' or 'c'   x := conjg( A' )*x.

		 Unchanged on exit.

		 TRANSA is defaulted to 'N' for F95 INTERFACE.

       DIAG (input)
		 On  entry, DIAG specifies whether or not A is unit triangular
		 as follows:

		 DIAG = 'U' or 'u'   A is assumed to be unit triangular.

		 DIAG = 'N' or 'n'   A is not assumed to be unit triangular.

		 Unchanged on exit.

       N (input)
		 On entry, N specifies the order of the matrix	A.   N	>=  0.
		 Unchanged on exit.

       A (input)
		 ( ( n*( n + 1 ) )/2 ).	 Before entry with  UPLO = 'U' or 'u',
		 the array A must contain the upper triangular	matrix	packed
		 sequentially, column by column, so that A( 1 ) contains a( 1,
		 1 ), A( 2 ) and A( 3 ) contain a( 1,  2  )  and  a(  2,  2  )
		 respectively,	and  so	 on.   Before entry with UPLO = 'L' or
		 'l', the array A must contain	the  lower  triangular	matrix
		 packed	 sequentially,	column	by column, so that A( 1 ) con‐
		 tains a( 1, 1 ), A( 2 ) and A( 3 ) contain a( 2, 1 )  and  a(
		 3,  1	) respectively, and so on.  Note that when  DIAG = 'U'
		 or 'u', the diagonal elements of A are	 not  referenced,  but
		 are assumed to be unity.  Unchanged on exit.

       Y (input/output)
		 ( 1 + ( n - 1 )*abs( INCY ) ).	 Before entry, the incremented
		 array Y must contain the n element vector x. On  exit,	 Y  is
		 overwritten with the tranformed vector x.

       INCY (input)
		 On entry, INCY specifies the increment for the elements of Y.
		 INCY <> 0.  Unchanged on exit.

				  6 Mar 2009			     ctpmv(3P)
[top]

List of man pages available for OpenIndiana

Copyright (c) for man pages and the logo by the respective OS vendor.

For those who want to learn more, the polarhome community provides shell access and support.

[legal] [privacy] [GNU] [policy] [cookies] [netiquette] [sponsors] [FAQ]
Tweet
Polarhome, production since 1999.
Member of Polarhome portal.
Based on Fawad Halim's script.
....................................................................
Vote for polarhome
Free Shell Accounts :: the biggest list on the net