DeepDarkFantasy-0.2017.8.4: A DSL for creating neural network.

Safe HaskellSafe
LanguageHaskell2010

DDF.Meta.Interpreter

Documentation

newtype Eval h x Source #

Constructors

Eval 

Fields

data Combine l r h x Source #

Constructors

Combine (l h x) (r h x) 

combineLeft :: Combine t2 t t1 t3 -> t2 t1 t3 Source #

combineRight :: Combine t t2 t1 t3 -> t2 t1 t3 Source #

newtype UnHOAS repr h x Source #

Constructors

UnHOAS 

Fields

class ProdCon con l r where Source #

Minimal complete definition

prodCon

Methods

prodCon :: (con l, con r) :- con (l, r) Source #

Instances

ProdCon Show l r Source # 

Methods

prodCon :: (Show l, Show r) :- Show (l, r) Source #

ProdCon Random l r Source # 

Methods

prodCon :: (Random l, Random r) :- Random (l, r) Source #

ProdCon RandRange l r Source # 

Methods

prodCon :: (RandRange l, RandRange r) :- RandRange (l, r) Source #

Lang repr => ProdCon (Reify repr) l r Source # 

Methods

prodCon :: (Reify repr l, Reify repr r) :- Reify repr (l, r) Source #

Lang repr => ProdCon (WithDiff repr) l r Source # 

Methods

prodCon :: (WithDiff repr l, WithDiff repr r) :- WithDiff repr (l, r) Source #

class Weight w where Source #

Minimal complete definition

weightCon

Methods

weightCon :: (con (), con Float, con Double, ForallV (ProdCon con)) :- con w Source #

Instances

Weight Double Source # 

Methods

weightCon :: (con (), con Float, con Double, ForallV (* -> * -> Constraint) (ProdCon con)) :- con Double Source #

Weight Float Source # 

Methods

weightCon :: (con (), con Float, con Double, ForallV (* -> * -> Constraint) (ProdCon con)) :- con Float Source #

Weight () Source # 

Methods

weightCon :: (con (), con Float, con Double, ForallV (* -> * -> Constraint) (ProdCon con)) :- con () Source #

(Weight l, Weight r) => Weight (l, r) Source # 

Methods

weightCon :: (con (), con Float, con Double, ForallV (* -> * -> Constraint) (ProdCon con)) :- con (l, r) Source #

data RunImpW repr h x Source #

Constructors

Weight w => RunImpW (repr h (w -> x)) 

data ImpW repr h x Source #

Constructors

NoImpW (repr h x) 
Weight w => ImpW (repr h (w -> x)) 

type RunImpWR repr h x = forall r. (forall w. Weight w => repr h (w -> x) -> r) -> r Source #

runImpW2RunImpWR :: RunImpW repr h x -> RunImpWR repr h x Source #

runImpWR2RunImpW :: RunImpWR repr h x -> RunImpW repr h x Source #