DeepDarkFantasy-0.2017.8.4: A DSL for creating neural network.

Safe HaskellSafe
LanguageHaskell2010

DDF.Combine

Contents

Documentation

Orphan instances

(DBI l, DBI r) => DBI (Combine l r) Source # 

Methods

z :: Combine l r (a, h) a Source #

s :: Combine l r h b -> Combine l r (a, h) b Source #

abs :: Combine l r (a, h) b -> Combine l r h (a -> b) Source #

app :: Combine l r h (a -> b) -> Combine l r h a -> Combine l r h b Source #

hoas :: (Combine l r (a, h) a -> Combine l r (a, h) b) -> Combine l r h (a -> b) Source #

com :: Combine l r h ((b -> c) -> (a -> b) -> a -> c) Source #

flip :: Combine l r h ((a -> b -> c) -> b -> a -> c) Source #

id :: Combine l r h (a -> a) Source #

const :: Combine l r h (a -> b -> a) Source #

scomb :: Combine l r h ((a -> b -> c) -> (a -> b) -> a -> c) Source #

dup :: Combine l r h ((a -> a -> b) -> a -> b) Source #

let_ :: Combine l r h (a -> (a -> b) -> b) Source #

(Fix l, Fix r) => Fix (Combine l r) Source # 

Methods

fix :: Combine l r h (f (Fix f) -> Fix f) Source #

runFix :: Combine l r h (Fix f -> f (Fix f)) Source #

(Float l, Float r) => Float (Combine l r) Source # 
(FreeVector l, FreeVector r) => FreeVector (Combine l r) Source # 

Methods

freeVector :: Combine l r h ((b -> d) -> FreeVector b d) Source #

runFreeVector :: Combine l r h (FreeVector b d -> b -> d) Source #

(Option l, Option r) => Option (Combine l r) Source # 

Methods

nothing :: Combine l r h (Maybe a) Source #

just :: Combine l r h (a -> Maybe a) Source #

optionMatch :: Combine l r h (b -> (a -> b) -> Maybe a -> b) Source #

(Prod l, Prod r) => Prod (Combine l r) Source # 

Methods

mkProd :: Combine l r h (a -> b -> (a, b)) Source #

zro :: Combine l r h ((a, b) -> a) Source #

fst :: Combine l r h ((a, b) -> b) Source #

swap :: Combine l r h ((x, y) -> (y, x)) Source #

curry :: Combine l r h (((a, b) -> c) -> a -> b -> c) Source #

uncurry :: Combine l r h ((a -> b -> c) -> (a, b) -> c) Source #

(Dual l, Dual r) => Dual (Combine l r) Source # 

Methods

dual :: Combine l r h ((x, y) -> Dual x y) Source #

runDual :: Combine l r h (Dual x y -> (x, y)) Source #

mkDual :: Combine l r h (x -> y -> Dual x y) Source #

dualOrig :: Combine l r h (Dual x y -> x) Source #

dualDiff :: Combine l r h (Dual x y -> y) Source #

(Sum l, Sum r) => Sum (Combine l r) Source # 

Methods

left :: Combine l r h (a -> Either a b) Source #

right :: Combine l r h (b -> Either a b) Source #

sumMatch :: Combine l r h ((a -> c) -> (b -> c) -> Either a b -> c) Source #

(Unit l, Unit r) => Unit (Combine l r) Source # 

Methods

unit :: Combine l r h () Source #

(Y l, Y r) => Y (Combine l r) Source # 

Methods

y :: Combine l r h ((a -> a) -> a) Source #

undefined :: Combine l r h a Source #

(List l, List r) => List (Combine l r) Source # 

Methods

nil :: Combine l r h [a] Source #

cons :: Combine l r h (a -> [a] -> [a]) Source #

listMatch :: Combine l r h (b -> (a -> [a] -> b) -> [a] -> b) Source #

listAppend :: Combine l r h ([a] -> [a] -> [a]) Source #

(Char l, Char r) => Char (Combine l r) Source # 

Methods

char :: Char -> Combine l r h Char Source #

(IO l, IO r) => IO (Combine l r) Source # 

Methods

putStrLn :: Combine l r h (String -> IO ()) Source #

(Bool l, Bool r) => Bool (Combine l r) Source # 

Methods

bool :: Bool -> Combine l r h Bool Source #

ite :: Combine l r h (a -> a -> Bool -> a) Source #

(Double l, Double r) => Double (Combine l r) Source # 
(Map l, Map r) => Map (Combine l r) Source # 

Methods

empty :: Combine l r h (Map k a) Source #

singleton :: Combine l r h (k -> a -> Map k a) Source #

lookup :: Ord k => Combine l r h (Map k a -> k -> Maybe a) Source #

alter :: Ord k => Combine l r h ((Maybe a -> Maybe a) -> k -> Map k a -> Map k a) Source #

mapMap :: Combine l r h ((a -> b) -> Map k a -> Map k b) Source #

unionWith :: Ord k => Combine l r h ((a -> a -> a) -> Map k a -> Map k a -> Map k a) Source #

insert :: Ord k => Combine l r h (k -> a -> Map k a -> Map k a) Source #

(DiffWrapper l, DiffWrapper r) => DiffWrapper (Combine l r) Source # 
(VectorTF l, VectorTF r) => VectorTF (Combine l r) Source # 

Methods

zero :: Combine l r h (VectorTF t f) Source #

basis :: Combine l r h (t -> VectorTF t f) Source #

plus :: Combine l r h (f -> f -> VectorTF t f) Source #

mult :: Combine l r h (Double -> f -> VectorTF t f) Source #

vtfMatch :: Combine l r h (a -> (t -> a) -> (f -> f -> a) -> (Double -> f -> a) -> VectorTF t f -> a) Source #

(Int l, Int r) => Int (Combine l r) Source # 

Methods

int :: Int -> Combine l r h Int Source #

pred :: Combine l r h (Int -> Int) Source #

isZero :: Combine l r h (Int -> Bool) Source #

(Bimap l, Bimap r) => Bimap (Combine l r) Source # 

Methods

size :: Combine l r h (Bimap a b -> Int) Source #

lookupL :: (Ord a, Ord b) => Combine l r h (Bimap a b -> a -> Maybe b) Source #

lookupR :: (Ord a, Ord b) => Combine l r h (Bimap a b -> b -> Maybe a) Source #

empty :: Combine l r h (Bimap a b) Source #

singleton :: Combine l r h ((a, b) -> Bimap a b) Source #

toMapL :: Combine l r h (Bimap a b -> Map a b) Source #

toMapR :: Combine l r h (Bimap a b -> Map b a) Source #

insert :: (Ord a, Ord b) => Combine l r h ((a, b) -> Bimap a b -> Bimap a b) Source #

updateL :: (Ord a, Ord b) => Combine l r h ((b -> Maybe b) -> a -> Bimap a b -> Bimap a b) Source #

updateR :: (Ord a, Ord b) => Combine l r h ((a -> Maybe a) -> b -> Bimap a b -> Bimap a b) Source #

(Lang l, Lang r) => Lang (Combine l r) Source # 

Methods

exfalso :: Combine l r h (Void -> a) Source #

writer :: Combine l r h ((a, w) -> Writer w a) Source #

runWriter :: Combine l r h (Writer w a -> (a, w)) Source #

float2Double :: Combine l r h (Float -> Double) Source #

double2Float :: Combine l r h (Double -> Float) Source #

state :: Combine l r h ((x -> (y, x)) -> State x y) Source #

runState :: Combine l r h (State x y -> x -> (y, x)) Source #

iterate :: Combine l r h ((x -> x) -> x -> [x]) Source #

buildFreeVector :: Ord b => Combine l r h (FreeVectorBuilder b -> FreeVector b Double) Source #

toSVTFBuilder :: Ord b => Combine l r h (VectorTF b Int -> SVTFBuilder b) Source #

get :: Combine l r h (Maybe a -> a) Source #

getVar :: Combine l r h (State x x) Source #

update :: Combine l r h ((x -> x) -> State x ()) Source #

updateWengert :: Combine l r h (Int -> Double -> Map Int Double -> Map Int Double) Source #

vtfCata :: Combine l r h ((VectorTF a b -> b) -> Fix (VectorTF a) -> b) Source #

(Monad l m, Monad r m) => Monad (Combine l r) m Source # 

Methods

bind :: Combine l r h (m a -> (a -> m b) -> m b) Source #

join :: Combine l r h (m (m a) -> m a) Source #

(Applicative l m, Applicative r m) => Applicative (Combine l r) m Source # 

Methods

pure :: Combine l r h (x -> m x) Source #

ap :: Combine l r h (m (x -> y) -> m x -> m y) Source #

(Functor l m, Functor r m) => Functor (Combine l r) m Source # 

Methods

map :: Combine l r h ((a -> b) -> m a -> m b) Source #