testsuiteContentsIndex
Test.MathObj.PartialFraction
Contents
Properties for generic types
Properties for Integers
Properties for Polynomials
Synopsis
fractionConv :: (C a, C a) => [a] -> a -> Bool
fractionConvAlt :: (C a, C a) => [a] -> a -> Bool
scaleInt :: (C a, C a) => a -> T a -> Bool
add :: (C a, C a) => T a -> T a -> Bool
sub :: (C a, C a) => T a -> T a -> Bool
mul :: (C a, C a) => T a -> T a -> Bool
newtype SmallPrime = SmallPrime {
intFromSmallPrime :: Integer
}
type IntFraction = ([SmallPrime], Integer)
fractionConvInt :: [SmallPrime] -> Integer -> Bool
fractionConvAltInt :: [SmallPrime] -> Integer -> Bool
fromSmallPrimes :: IntFraction -> T Integer
scaleIntInt :: Integer -> IntFraction -> Bool
addInt :: IntFraction -> IntFraction -> Bool
subInt :: IntFraction -> IntFraction -> Bool
mulInt :: IntFraction -> IntFraction -> Bool
intTests :: Test
newtype IrredPoly = IrredPoly {
polyFromIrredPoly :: (T Rational)
}
type RatPolynomial = T Rational
type PolyFraction = ([IrredPoly], RatPolynomial)
fractionConvPoly :: [IrredPoly] -> RatPolynomial -> Bool
fractionConvAltPoly :: [IrredPoly] -> RatPolynomial -> Bool
fromIrredPolys :: PolyFraction -> T RatPolynomial
scaleIntPoly :: RatPolynomial -> PolyFraction -> Bool
addPoly :: PolyFraction -> PolyFraction -> Bool
subPoly :: PolyFraction -> PolyFraction -> Bool
mulPoly :: PolyFraction -> PolyFraction -> Bool
polyTests :: Test
tests :: Test
Properties for generic types
fractionConv :: (C a, C a) => [a] -> a -> Bool
fractionConvAlt :: (C a, C a) => [a] -> a -> Bool
scaleInt :: (C a, C a) => a -> T a -> Bool
add :: (C a, C a) => T a -> T a -> Bool
sub :: (C a, C a) => T a -> T a -> Bool
mul :: (C a, C a) => T a -> T a -> Bool
Properties for Integers
newtype SmallPrime
Arbitrary instance of that type generates irreducible elements for tests. Choosing from a list of examples is a simple yet effective design. If we would construct irreducible elements by a clever algorithm we might obtain multiple primes only rarely.
Constructors
SmallPrime
intFromSmallPrime :: Integer
show/hide Instances
type IntFraction = ([SmallPrime], Integer)
fractionConvInt :: [SmallPrime] -> Integer -> Bool
fractionConvAltInt :: [SmallPrime] -> Integer -> Bool
fromSmallPrimes :: IntFraction -> T Integer
scaleIntInt :: Integer -> IntFraction -> Bool
addInt :: IntFraction -> IntFraction -> Bool
subInt :: IntFraction -> IntFraction -> Bool
mulInt :: IntFraction -> IntFraction -> Bool
intTests :: Test
Properties for Polynomials
newtype IrredPoly
Constructors
IrredPoly
polyFromIrredPoly :: (T Rational)
show/hide Instances
type RatPolynomial = T Rational
type PolyFraction = ([IrredPoly], RatPolynomial)
fractionConvPoly :: [IrredPoly] -> RatPolynomial -> Bool
fractionConvAltPoly :: [IrredPoly] -> RatPolynomial -> Bool
fromIrredPolys :: PolyFraction -> T RatPolynomial
scaleIntPoly :: RatPolynomial -> PolyFraction -> Bool
addPoly :: PolyFraction -> PolyFraction -> Bool
subPoly :: PolyFraction -> PolyFraction -> Bool
mulPoly :: PolyFraction -> PolyFraction -> Bool
polyTests :: Test
tests :: Test
Produced by Haddock version 0.7