DeepDarkFantasy-0.2017.4.19: A DSL for creating neural network.

Safe HaskellSafe
LanguageHaskell2010

DDF.UInt

Documentation

data UInt h x Source #

Constructors

UInt 

Instances

DBI UInt Source # 

Methods

z :: UInt (a, h) a Source #

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

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

app :: UInt h (a -> b) -> UInt h a -> UInt h b Source #

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

liftEnv :: UInt () x -> UInt h x Source #

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

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

id :: UInt h (a -> a) Source #

const :: UInt h (a -> b -> a) Source #

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

dup :: UInt h ((a -> a -> b) -> a -> b) Source #

let_ :: UInt h (a -> (a -> b) -> b) Source #

Double UInt Source # 
Float UInt Source # 
Option UInt Source # 

Methods

nothing :: UInt h (Maybe a) Source #

just :: UInt h (a -> Maybe a) Source #

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

Prod UInt Source # 

Methods

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

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

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

swap :: UInt h ((x, y) -> (y, x)) Source #

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

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

Dual UInt Source # 

Methods

dual :: UInt h ((x, y) -> Dual x y) Source #

runDual :: UInt h (Dual x y -> (x, y)) Source #

mkDual :: UInt h (x -> y -> Dual x y) Source #

dualOrig :: UInt h (Dual x y -> x) Source #

dualDiff :: UInt h (Dual x y -> y) Source #

Map UInt Source # 

Methods

empty :: UInt h (Map k a) Source #

singleton :: UInt h (k -> a -> Map k a) Source #

lookup :: Ord k => UInt h (k -> Map k a -> Maybe a) Source #

alter :: Ord k => UInt h ((Maybe a -> Maybe a) -> k -> Map k a -> Map k a) Source #

mapMap :: UInt h ((a -> b) -> Map k a -> Map k b) Source #

Unit UInt Source # 

Methods

unit :: UInt h () Source #

Char UInt Source # 

Methods

char :: Char -> UInt h Char Source #

Bool UInt Source # 

Methods

bool :: Bool -> UInt h Bool Source #

ite :: UInt h (a -> a -> Bool -> a) Source #

Bimap UInt Source # 
Lang UInt Source # 

Methods

fix :: UInt h ((a -> a) -> a) Source #

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

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

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

exfalso :: UInt h (Void -> a) Source #

ioRet :: UInt h (a -> IO a) Source #

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

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

nil :: UInt h [a] Source #

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

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

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

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

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

float2Double :: UInt h (Float -> Double) Source #

double2Float :: UInt h (Double -> Float) Source #

undefined :: UInt h a Source #

state :: UInt h ((x -> (y, x)) -> State x y) Source #

runState :: UInt h (State x y -> x -> (y, x)) Source #

putStrLn :: UInt h (String -> IO ()) Source #

DLang UInt Source #