MagicHaskeller-0.9.6.7: Automatic inductive functional programmer by systematic search

Safe HaskellNone
LanguageHaskell98

MagicHaskeller.Minimal

Synopsis

Documentation

e :: Typeable a => (Exp -> Exp) -> a -> ProgGenSF -> Bool -> [[Exp]] Source #

f1E :: Typeable a => (Exp -> Exp) -> (a -> Bool) -> ProgGenSF -> Bool -> [[Exp]] Source #

f1EF :: (Filtrable a, Typeable a) => (Exp -> Exp) -> (a -> Bool) -> ProgGenSF -> Bool -> [[Exp]] Source #

f1EIO :: Typeable a => (Exp -> Exp) -> (a -> Bool) -> ProgGenSF -> Bool -> IO [[Exp]] Source #

f1EFIO :: (Filtrable a, Typeable a) => (Exp -> Exp) -> (a -> Bool) -> ProgGenSF -> Bool -> IO [[Exp]] Source #

class NearEq a where Source #

Minimal complete definition

(~=)

Methods

(~=) :: a -> a -> Bool infix 4 Source #

Instances

NearEq Bool Source # 

Methods

(~=) :: Bool -> Bool -> Bool Source #

NearEq Char Source # 

Methods

(~=) :: Char -> Char -> Bool Source #

NearEq Double Source # 

Methods

(~=) :: Double -> Double -> Bool Source #

NearEq Float Source # 

Methods

(~=) :: Float -> Float -> Bool Source #

NearEq Int Source # 

Methods

(~=) :: Int -> Int -> Bool Source #

NearEq Integer Source # 

Methods

(~=) :: Integer -> Integer -> Bool Source #

NearEq Ordering Source # 

Methods

(~=) :: Ordering -> Ordering -> Bool Source #

NearEq () Source # 

Methods

(~=) :: () -> () -> Bool Source #

NearEq a => NearEq [a] Source # 

Methods

(~=) :: [a] -> [a] -> Bool Source #

NearEq a => NearEq (Maybe a) Source # 

Methods

(~=) :: Maybe a -> Maybe a -> Bool Source #

(NearEq i, Integral i) => NearEq (Ratio i) Source # 

Methods

(~=) :: Ratio i -> Ratio i -> Bool Source #

(NearEq a, NearEq b) => NearEq (Either a b) Source # 

Methods

(~=) :: Either a b -> Either a b -> Bool Source #

(NearEq a, NearEq b) => NearEq (a, b) Source # 

Methods

(~=) :: (a, b) -> (a, b) -> Bool Source #

(NearEq a, NearEq b, NearEq c) => NearEq (a, b, c) Source # 

Methods

(~=) :: (a, b, c) -> (a, b, c) -> Bool Source #

postprocess :: Exp -> Exp Source #

postprocess replaces uncommon functions like catamorphisms with well-known functions.

ppExcel :: Exp -> Exp Source #

ppExcel replaces uncommon functions like catamorphisms with well-known functions.