lapack-0.3: Numerical Linear Algebra using LAPACK

Safe HaskellNone
LanguageHaskell98

Numeric.LAPACK.Matrix.Hermitian

Synopsis

Documentation

data Transposition Source #

Constructors

NonTransposed 
Transposed 
Instances
Bounded Transposition Source # 
Instance details

Defined in Numeric.LAPACK.Matrix.Modifier

Enum Transposition Source # 
Instance details

Defined in Numeric.LAPACK.Matrix.Modifier

Eq Transposition Source # 
Instance details

Defined in Numeric.LAPACK.Matrix.Modifier

Show Transposition Source # 
Instance details

Defined in Numeric.LAPACK.Matrix.Modifier

Semigroup Transposition Source # 
Instance details

Defined in Numeric.LAPACK.Matrix.Modifier

Monoid Transposition Source # 
Instance details

Defined in Numeric.LAPACK.Matrix.Modifier

size :: Hermitian sh a -> sh Source #

fromList :: (C sh, Storable a) => Order -> sh -> [a] -> Hermitian sh a Source #

identity :: (C sh, Floating a) => Order -> sh -> Hermitian sh a Source #

diagonal :: (C sh, Floating a) => Order -> Vector sh (RealOf a) -> Hermitian sh a Source #

takeDiagonal :: (C sh, Floating a) => Hermitian sh a -> Vector sh (RealOf a) Source #

forceOrder :: (C sh, Floating a) => Order -> Hermitian sh a -> Hermitian sh a Source #

stack :: (C sh0, Eq sh0, C sh1, Eq sh1, Floating a) => Hermitian sh0 a -> General sh0 sh1 a -> Hermitian sh1 a -> Hermitian (sh0 :+: sh1) a Source #

toSquare (stack a b c)

=

toSquare a ||| b
===
adjoint b ||| toSquare c

It holds order (stack a b c) = order b. The function is most efficient when the order of all blocks match.

split :: (C sh0, C sh1, Floating a) => Hermitian (sh0 :+: sh1) a -> (Hermitian sh0 a, General sh0 sh1 a, Hermitian sh1 a) Source #

takeTopLeft :: (C sh0, C sh1, Floating a) => Hermitian (sh0 :+: sh1) a -> Hermitian sh0 a Source #

takeTopRight :: (C sh0, C sh1, Floating a) => Hermitian (sh0 :+: sh1) a -> General sh0 sh1 a Source #

takeBottomRight :: (C sh0, C sh1, Floating a) => Hermitian (sh0 :+: sh1) a -> Hermitian sh1 a Source #

multiplyVector :: (C sh, Eq sh, Floating a) => Transposition -> Hermitian sh a -> Vector sh a -> Vector sh a Source #

square :: (C sh, Eq sh, Floating a) => Hermitian sh a -> Hermitian sh a Source #

multiplyFull :: (C vert, C horiz, C height, Eq height, C width, Floating a) => Transposition -> Hermitian height a -> Full vert horiz height width a -> Full vert horiz height width a Source #

outer :: (C sh, Floating a) => Order -> Vector sh a -> Hermitian sh a Source #

sumRank1 :: (C sh, Eq sh, Floating a) => Order -> sh -> [(RealOf a, Vector sh a)] -> Hermitian sh a Source #

sumRank1NonEmpty :: (C sh, Eq sh, Floating a) => Order -> T [] (RealOf a, Vector sh a) -> Hermitian sh a Source #

sumRank2 :: (C sh, Eq sh, Floating a) => Order -> sh -> [(a, (Vector sh a, Vector sh a))] -> Hermitian sh a Source #

sumRank2NonEmpty :: (C sh, Eq sh, Floating a) => Order -> T [] (a, (Vector sh a, Vector sh a)) -> Hermitian sh a Source #

toSquare :: (C sh, Floating a) => Hermitian sh a -> Square sh a Source #

gramian :: (C height, C width, Floating a) => General height width a -> Hermitian width a Source #

A^H * A

congruenceDiagonal :: (C height, Eq height, C width, Eq width, Floating a) => Vector height (RealOf a) -> General height width a -> Hermitian width a Source #

A^H * D * A

congruence :: (C height, Eq height, C width, Eq width, Floating a) => Hermitian height a -> General height width a -> Hermitian width a Source #

A^H * B * A

anticommutator :: (C vert, C horiz, C height, Eq height, C width, Eq width, Floating a) => Full vert horiz height width a -> Full vert horiz height width a -> Hermitian width a Source #

anticommutator A B = A^H * B + B^H * A

Not exactly a matrix anticommutator, thus I like to call it Hermitian anticommutator.

addAdjoint :: (C sh, Floating a) => Square sh a -> Hermitian sh a Source #

A^H + A

solve :: (C vert, C horiz, C sh, Eq sh, C nrhs, Floating a) => Hermitian sh a -> Full vert horiz sh nrhs a -> Full vert horiz sh nrhs a Source #

inverse :: (C sh, Floating a) => Hermitian sh a -> Hermitian sh a Source #

determinant :: (C sh, Floating a) => Hermitian sh a -> RealOf a Source #

eigenvalues :: (C sh, Floating a) => Hermitian sh a -> Vector sh (RealOf a) Source #

eigensystem :: (C sh, Floating a) => Hermitian sh a -> (Square sh a, Vector sh (RealOf a)) Source #

For symmetric eigenvalue problems, eigensystem and schur coincide.