| Safe Haskell | Safe | 
|---|---|
| Language | Haskell98 | 
DDC.Core.Salt.Exp
- module DDC.Core.Exp.Generic
 - class FromAnnot c1 c2 | c1 -> c2 where
 - data ErrorFromAnnot
 - type Annot = GAnnot Name
 - type Bind = GBind Name
 - type Bound = GBound Name
 - type Prim = GPrim Name
 - type Exp = GExp Name
 - type Abs = GAbs Name
 - type Arg = GArg Name
 - type Lets = GLets Name
 - type Alt = GAlt Name
 - type Pat = GPat Name
 - type Cast = GCast Name
 - type Witness = GWitness Name
 - type WiCon = GWiCon Name
 - type Type = Type Name
 
Documentation
module DDC.Core.Exp.Generic
class FromAnnot c1 c2 | c1 -> c2 where Source #
Convert annotated version of the Core language to the Salt fragment.
Minimal complete definition
Methods
fromAnnot :: c1 -> Either ErrorFromAnnot c2 Source #
Instances
| FromAnnot (Pat Name) Pat Source # | |
| FromAnnot (WiCon Name) WiCon Source # | |
| FromAnnot (Bind Name) (Bind Name) Source # | |
| FromAnnot (Bound Name) (Bound Name) Source # | |
| FromAnnot (Type Name) (Type Name) Source # | |
| FromAnnot (Exp a Name) Exp Source # | |
| FromAnnot (Lets a Name) Lets Source # | |
| FromAnnot (Alt a Name) Alt Source # | |
| FromAnnot (Cast a Name) Cast Source # | |
| FromAnnot (Witness a Name) Witness Source # | |
| FromAnnot (DaCon Name (Type Name)) (DaCon Name (Type Name)) Source # | |
data ErrorFromAnnot Source #
Things that can go wrong when converting Salt code.
Constructors
| ErrorFromAnnotFoundNakedType | Found a type that isn't part of a function application.  | 
| ErrorFromAnnotFoundNakedWitness | Found a witness that isn't part of a function application.  |