Safe Haskell | None |
---|---|
Language | Haskell98 |
Synopsis
- newtype Q = Q Rational
- numeratorQ :: Q -> Integer
- denominatorQ :: Q -> Integer
- extendedEuclid :: Integral b => b -> b -> (b, b, b)
- newtype Fp n = Fp Integer
- class (Eq fq, Fractional fq) => FiniteField fq where
- primitiveElt :: (Eq a, Num a) => [a] -> a
- powers :: (Eq a, Num a) => a -> [a]
- char :: Foldable t => t a -> Int
- type F2 = Fp T2
- f2 :: [F2]
- type F3 = Fp T3
- f3 :: [F3]
- type F5 = Fp T5
- f5 :: [F5]
- type F7 = Fp T7
- f7 :: [F7]
- type F11 = Fp T11
- f11 :: [F11]
- type F13 = Fp T13
- f13 :: [F13]
- type F17 = Fp T17
- f17 :: [F17]
- type F19 = Fp T19
- f19 :: [F19]
- type F23 = Fp T23
- f23 :: [F23]
- type F29 = Fp T29
- f29 :: [F29]
- type F31 = Fp T31
- f31 :: [F31]
- type F37 = Fp T37
- f37 :: [F37]
- type F41 = Fp T41
- f41 :: [F41]
- type F43 = Fp T43
- f43 :: [F43]
- type F47 = Fp T47
- f47 :: [F47]
- type F53 = Fp T53
- f53 :: [F53]
- type F59 = Fp T59
- f59 :: [F59]
- type F61 = Fp T61
- f61 :: [F61]
- type F67 = Fp T67
- f67 :: [F67]
- type F71 = Fp T71
- f71 :: [F71]
- type F73 = Fp T73
- f73 :: [F73]
- type F79 = Fp T79
- f79 :: [F79]
- type F83 = Fp T83
- f83 :: [F83]
- type F89 = Fp T89
- f89 :: [F89]
- type F97 = Fp T97
- f97 :: [F97]
Documentation
Q is just the rationals, but with a better show function than the Prelude version
Instances
numeratorQ :: Q -> Integer Source #
denominatorQ :: Q -> Integer Source #
extendedEuclid :: Integral b => b -> b -> (b, b, b) Source #
Instances
PolynomialAsType F5 ConwayF25 Source # | |
PolynomialAsType F3 ConwayF27 Source # | |
PolynomialAsType F3 ConwayF9 Source # | |
PolynomialAsType F2 ConwayF32 Source # | |
PolynomialAsType F2 ConwayF16 Source # | |
PolynomialAsType F2 ConwayF8 Source # | |
PolynomialAsType F2 ConwayF4 Source # | |
Eq (Fp n) Source # | |
IntegerAsType n => Fractional (Fp n) Source # | |
IntegerAsType n => Num (Fp n) Source # | |
Ord (Fp n) Source # | |
Show (Fp n) Source # | |
IntegerAsType p => FinSet (Fp p) Source # | |
Defined in Math.Algebra.Field.Base | |
IntegerAsType p => FiniteField (Fp p) Source # | |
class (Eq fq, Fractional fq) => FiniteField fq where Source #
Instances
FiniteField J9 Source # | |
FiniteField F9 Source # | |
IntegerAsType p => FiniteField (Fp p) Source # | |
(FiniteField k, PolynomialAsType k poly) => FiniteField (ExtensionField k poly) Source # | |
Defined in Math.Algebra.Field.Extension eltsFq :: ExtensionField k poly -> [ExtensionField k poly] Source # basisFq :: ExtensionField k poly -> [ExtensionField k poly] Source # |
primitiveElt :: (Eq a, Num a) => [a] -> a Source #