aern2-mfun-0.2.9.0: Multi-variate real function optimisation and proving
Safe HaskellNone
LanguageHaskell2010

AERN2.Linear.Matrix.Type

Documentation

data Matrix a Source #

Constructors

Matrix 

Fields

Instances

Instances details
Functor Matrix Source # 
Instance details

Defined in AERN2.Linear.Matrix.Type

Methods

fmap :: (a -> b) -> Matrix a -> Matrix b #

(<$) :: a -> Matrix b -> Matrix a #

Show a => Show (Matrix a) Source # 
Instance details

Defined in AERN2.Linear.Matrix.Type

Methods

showsPrec :: Int -> Matrix a -> ShowS #

show :: Matrix a -> String #

showList :: [Matrix a] -> ShowS #

(HasAccuracy a, HasPrecision a) => HasAccuracy (Matrix a) Source # 
Instance details

Defined in AERN2.Linear.Matrix.Type

HasPrecision a => HasPrecision (Matrix a) Source # 
Instance details

Defined in AERN2.Linear.Matrix.Type

CanTestErrorsPresent a => CanTestErrorsPresent (Matrix a) Source # 
Instance details

Defined in AERN2.Linear.Matrix.Type

Methods

hasError :: Matrix a -> Bool #

CanIntersectAsymmetric (Matrix (CN MPBall)) (Matrix (CN MPBall)) Source # 
Instance details

Defined in AERN2.Linear.Matrix.Type

Associated Types

type IntersectionType (Matrix (CN MPBall)) (Matrix (CN MPBall)) #

(CanAddSameType a, CanMulSameType a, HasIntegers a) => CanMulAsymmetric (Matrix a) (Vector a) Source # 
Instance details

Defined in AERN2.Linear.Matrix.Type

Associated Types

type MulType (Matrix a) (Vector a) #

Methods

mul :: Matrix a -> Vector a -> MulType (Matrix a) (Vector a) #

(CanAddSameType a, CanMulSameType a, HasIntegers a) => CanMulAsymmetric (Matrix a) (Matrix a) Source # 
Instance details

Defined in AERN2.Linear.Matrix.Type

Associated Types

type MulType (Matrix a) (Matrix a) #

Methods

mul :: Matrix a -> Matrix a -> MulType (Matrix a) (Matrix a) #

CanAddSameType a => CanAddAsymmetric (Matrix a) (Matrix a) Source # 
Instance details

Defined in AERN2.Linear.Matrix.Type

Associated Types

type AddType (Matrix a) (Matrix a) #

Methods

add :: Matrix a -> Matrix a -> AddType (Matrix a) (Matrix a) #

CanSubSameType a => CanSub (Matrix a) (Matrix a) Source # 
Instance details

Defined in AERN2.Linear.Matrix.Type

Associated Types

type SubType (Matrix a) (Matrix a) #

Methods

sub :: Matrix a -> Matrix a -> SubType (Matrix a) (Matrix a) #

type IntersectionType (Matrix (CN MPBall)) (Matrix (CN MPBall)) Source # 
Instance details

Defined in AERN2.Linear.Matrix.Type

type MulType (Matrix a) (Vector a) Source # 
Instance details

Defined in AERN2.Linear.Matrix.Type

type MulType (Matrix a) (Vector a) = Vector a
type MulType (Matrix a) (Matrix a) Source # 
Instance details

Defined in AERN2.Linear.Matrix.Type

type MulType (Matrix a) (Matrix a) = Matrix a
type AddType (Matrix a) (Matrix a) Source # 
Instance details

Defined in AERN2.Linear.Matrix.Type

type AddType (Matrix a) (Matrix a) = Matrix a
type SubType (Matrix a) (Matrix a) Source # 
Instance details

Defined in AERN2.Linear.Matrix.Type

type SubType (Matrix a) (Matrix a) = Matrix a

get :: Matrix a -> Integer -> Integer -> a Source #

rows :: Matrix a -> [Vector a] Source #

imap :: (Integer -> Integer -> a -> a) -> Matrix a -> Matrix a Source #