Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
The core Futhark AST is parameterised by a lore
type parameter,
which is then used to invoke the type families defined here.
Synopsis
- class (Show (LetDec l), Show (ExpDec l), Show (BodyDec l), Show (FParamInfo l), Show (LParamInfo l), Show (RetType l), Show (BranchType l), Show (Op l), Eq (LetDec l), Eq (ExpDec l), Eq (BodyDec l), Eq (FParamInfo l), Eq (LParamInfo l), Eq (RetType l), Eq (BranchType l), Eq (Op l), Ord (LetDec l), Ord (ExpDec l), Ord (BodyDec l), Ord (FParamInfo l), Ord (LParamInfo l), Ord (RetType l), Ord (BranchType l), Ord (Op l), IsRetType (RetType l), IsBodyType (BranchType l), Typed (FParamInfo l), Typed (LParamInfo l), Typed (LetDec l), DeclTyped (FParamInfo l), SexpIso (LetDec l), SexpIso (ExpDec l), SexpIso (BodyDec l), SexpIso (FParamInfo l), SexpIso (LParamInfo l), SexpIso (RetType l), SexpIso (BranchType l), SexpIso (Op l)) => Decorations l where
- module Futhark.IR.RetType
Documentation
class (Show (LetDec l), Show (ExpDec l), Show (BodyDec l), Show (FParamInfo l), Show (LParamInfo l), Show (RetType l), Show (BranchType l), Show (Op l), Eq (LetDec l), Eq (ExpDec l), Eq (BodyDec l), Eq (FParamInfo l), Eq (LParamInfo l), Eq (RetType l), Eq (BranchType l), Eq (Op l), Ord (LetDec l), Ord (ExpDec l), Ord (BodyDec l), Ord (FParamInfo l), Ord (LParamInfo l), Ord (RetType l), Ord (BranchType l), Ord (Op l), IsRetType (RetType l), IsBodyType (BranchType l), Typed (FParamInfo l), Typed (LParamInfo l), Typed (LetDec l), DeclTyped (FParamInfo l), SexpIso (LetDec l), SexpIso (ExpDec l), SexpIso (BodyDec l), SexpIso (FParamInfo l), SexpIso (LParamInfo l), SexpIso (RetType l), SexpIso (BranchType l), SexpIso (Op l)) => Decorations l Source #
A collection of type families, along with constraints specifying that the types they map to should satisfy some minimal requirements.
type LetDec l :: Type Source #
Decoration for every let-pattern element.
type ExpDec l :: Type Source #
Decoration for every expression.
type ExpDec l = ()
type BodyDec l :: Type Source #
Decoration for every body.
type BodyDec l = ()
type FParamInfo l :: Type Source #
Decoration for every (non-lambda) function parameter.
type FParamInfo l = DeclType
type LParamInfo l :: Type Source #
Decoration for every lambda function parameter.
type LParamInfo l = Type
type RetType l :: Type Source #
The return type decoration of function calls.
type RetType l = DeclExtType
type BranchType l :: Type Source #
The return type decoration of branches.
type BranchType l = ExtType
Extensible operation.
type Op l = ()
Instances
Decorations Seq Source # | |
Decorations SOACS Source # | |
Decorations MCMem Source # | |
Decorations MC Source # | |
Decorations SeqMem Source # | |
Decorations Kernels Source # | |
Decorations KernelsMem Source # | |
Defined in Futhark.IR.KernelsMem type LetDec KernelsMem Source # type ExpDec KernelsMem Source # type BodyDec KernelsMem Source # type FParamInfo KernelsMem Source # type LParamInfo KernelsMem Source # type RetType KernelsMem Source # type BranchType KernelsMem Source # type Op KernelsMem Source # | |
(Decorations lore, CanBeAliased (Op lore)) => Decorations (Aliases lore) Source # | |
Defined in Futhark.IR.Aliases | |
(Decorations lore, CanBeWise (Op lore)) => Decorations (Wise lore) Source # | |
Defined in Futhark.Optimise.Simplify.Lore |
module Futhark.IR.RetType