DeepDarkFantasy-0.2017.4.1: A DSL for creating neural network.

Safe HaskellSafe
LanguageHaskell2010

DDF.GWDiff

Documentation

newtype GWDiff repr h x Source #

Constructors

GWDiff 

Fields

Instances

DBI repr => DBI (GWDiff repr) Source # 

Methods

z :: GWDiff repr (a, h) a Source #

s :: GWDiff repr h b -> GWDiff repr (a, h) b Source #

abs :: GWDiff repr (a, h) b -> GWDiff repr h (a -> b) Source #

app :: GWDiff repr h (a -> b) -> GWDiff repr h a -> GWDiff repr h b Source #

hoas :: (GWDiff repr (a, h) a -> GWDiff repr (a, h) b) -> GWDiff repr h (a -> b) Source #

com :: GWDiff repr h ((b -> c) -> (a -> b) -> a -> c) Source #

flip :: GWDiff repr h ((a -> b -> c) -> b -> a -> c) Source #

id :: GWDiff repr h (a -> a) Source #

const :: GWDiff repr h (a -> b -> a) Source #

scomb :: GWDiff repr h ((a -> b -> c) -> (a -> b) -> a -> c) Source #

dup :: GWDiff repr h ((a -> a -> b) -> a -> b) Source #

let_ :: GWDiff repr h (a -> (a -> b) -> b) Source #

Bool r => Bool (GWDiff r) Source # 

Methods

bool :: Bool -> GWDiff r h Bool Source #

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

Lang repr => Lang (GWDiff repr) Source # 

Methods

mkProd :: GWDiff repr h (a -> b -> (a, b)) Source #

zro :: GWDiff repr h ((a, b) -> a) Source #

fst :: GWDiff repr h ((a, b) -> b) Source #

double :: Double -> GWDiff repr h Double Source #

doubleZero :: GWDiff repr h Double Source #

doubleOne :: GWDiff repr h Double Source #

doublePlus :: GWDiff repr h (Double -> Double -> Double) Source #

doubleMinus :: GWDiff repr h (Double -> Double -> Double) Source #

doubleMult :: GWDiff repr h (Double -> Double -> Double) Source #

doubleDivide :: GWDiff repr h (Double -> Double -> Double) Source #

doubleExp :: GWDiff repr h (Double -> Double) Source #

float :: Float -> GWDiff repr h Float Source #

floatZero :: GWDiff repr h Float Source #

floatOne :: GWDiff repr h Float Source #

floatPlus :: GWDiff repr h (Float -> Float -> Float) Source #

floatMinus :: GWDiff repr h (Float -> Float -> Float) Source #

floatMult :: GWDiff repr h (Float -> Float -> Float) Source #

floatDivide :: GWDiff repr h (Float -> Float -> Float) Source #

floatExp :: GWDiff repr h (Float -> Float) Source #

fix :: GWDiff repr h ((a -> a) -> a) Source #

left :: GWDiff repr h (a -> Either a b) Source #

right :: GWDiff repr h (b -> Either a b) Source #

sumMatch :: GWDiff repr h ((a -> c) -> (b -> c) -> Either a b -> c) Source #

unit :: GWDiff repr h () Source #

exfalso :: GWDiff repr h (Void -> a) Source #

nothing :: GWDiff repr h (Maybe a) Source #

just :: GWDiff repr h (a -> Maybe a) Source #

optionMatch :: GWDiff repr h (b -> (a -> b) -> Maybe a -> b) Source #

ioRet :: GWDiff repr h (a -> IO a) Source #

ioBind :: GWDiff repr h (IO a -> (a -> IO b) -> IO b) Source #

ioMap :: GWDiff repr h ((a -> b) -> IO a -> IO b) Source #

nil :: GWDiff repr h [a] Source #

cons :: GWDiff repr h (a -> [a] -> [a]) Source #

listMatch :: GWDiff repr h (b -> (a -> [a] -> b) -> [a] -> b) Source #

listAppend :: GWDiff repr h ([a] -> [a] -> [a]) Source #

writer :: GWDiff repr h ((a, w) -> Writer w a) Source #

runWriter :: GWDiff repr h (Writer w a -> (a, w)) Source #

swap :: GWDiff repr h ((l, r) -> (r, l)) Source #

curry :: GWDiff repr h (((a, b) -> c) -> a -> b -> c) Source #

uncurry :: GWDiff repr h ((a -> b -> c) -> (a, b) -> c) Source #

float2Double :: GWDiff repr h (Float -> Double) Source #

double2Float :: GWDiff repr h (Double -> Float) Source #

undefined :: GWDiff repr h a Source #

state :: GWDiff repr h ((l -> (r, l)) -> State l r) Source #

runState :: GWDiff repr h (State l r -> l -> (r, l)) Source #