Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- hypergeomat :: forall a. (Eq a, Fractional a, BaseFrac a) => Int -> BaseFracType a -> [a] -> [a] -> [a] -> IO a
- type GaussianRational = Cyclotomic
- (+:) :: Rational -> Rational -> GaussianRational
Documentation
:: forall a. (Eq a, Fractional a, BaseFrac a) | |
=> Int | truncation weight |
-> BaseFracType a | alpha parameter (usually 2) |
-> [a] | upper parameters |
-> [a] | lower parameters |
-> [a] | variables (the eigenvalues) |
-> IO a |
Hypergeometric function of a matrix argument.
Actually the matrix argument is given by the eigenvalues of the matrix.
For a type a
of real numbers, `BaseFracType a = a`. If `a = Complex b`
is a type of complex numbers, then `BaseFracType a = b`. Thus alpha
parameter cannot be a complex number.
type GaussianRational = Cyclotomic Source #