Safe Haskell | Safe-Inferred |
---|
Utilities for constructing and destructing compound expressions.
For the Simple version of the AST.
- module DDC.Type.Compounds
- xLAMs :: [Bind n] -> Exp a n -> Exp a n
- xLams :: [Bind n] -> Exp a n -> Exp a n
- makeXLamFlags :: [(Bool, Bind n)] -> Exp a n -> Exp a n
- takeXLAMs :: Exp a n -> Maybe ([Bind n], Exp a n)
- takeXLams :: Exp a n -> Maybe ([Bind n], Exp a n)
- takeXLamFlags :: Exp a n -> Maybe ([(Bool, Bind n)], Exp a n)
- xApps :: Exp a n -> [Exp a n] -> Exp a n
- takeXApps :: Exp a n -> Maybe (Exp a n, [Exp a n])
- takeXApps1 :: Exp a n -> Exp a n -> (Exp a n, [Exp a n])
- takeXAppsAsList :: Exp a n -> [Exp a n]
- takeXConApps :: Exp a n -> Maybe (DaCon n, [Exp a n])
- takeXPrimApps :: Exp a n -> Maybe (n, [Exp a n])
- xLets :: [Lets a n] -> Exp a n -> Exp a n
- splitXLets :: Exp a n -> ([Lets a n], Exp a n)
- bindsOfLets :: Lets a n -> ([Bind n], [Bind n])
- specBindsOfLets :: Lets a n -> [Bind n]
- valwitBindsOfLets :: Lets a n -> [Bind n]
- bindsOfPat :: Pat n -> [Bind n]
- takeCtorNameOfAlt :: Alt a n -> Maybe n
- wApp :: Witness a n -> Witness a n -> Witness a n
- wApps :: Witness a n -> [Witness a n] -> Witness a n
- takeXWitness :: Exp a n -> Maybe (Witness a n)
- takeWAppsAsList :: Witness a n -> [Witness a n]
- takePrimWiConApps :: Witness a n -> Maybe (n, [Witness a n])
- takeXType :: Exp a n -> Maybe (Type n)
- xUnit :: Exp a n
- dcUnit :: DaCon n
- takeNameOfDaCon :: DaCon n -> Maybe n
- takeTypeOfDaCon :: DaCon n -> Maybe (Type n)
Documentation
module DDC.Type.Compounds
Lambdas
makeXLamFlags :: [(Bool, Bind n)] -> Exp a n -> Exp a nSource
Make some nested lambda abstractions, using a flag to indicate whether the lambda is a level-1 (True), or level-0 (False) binder.
takeXLAMs :: Exp a n -> Maybe ([Bind n], Exp a n)Source
Split type lambdas from the front of an expression,
or Nothing
if there aren't any.
takeXLams :: Exp a n -> Maybe ([Bind n], Exp a n)Source
Split nested value or witness lambdas from the front of an expression,
or Nothing
if there aren't any.
takeXLamFlags :: Exp a n -> Maybe ([(Bool, Bind n)], Exp a n)Source
Split nested lambdas from the front of an expression, with a flag indicating whether the lambda was a level-1 (True), or level-0 (False) binder.
Applications
takeXApps :: Exp a n -> Maybe (Exp a n, [Exp a n])Source
Flatten an application into the function part and its arguments.
Returns Nothing
if there is no outer application.
takeXApps1 :: Exp a n -> Exp a n -> (Exp a n, [Exp a n])Source
Flatten an application into the function part and its arguments.
This is like takeXApps
above, except we know there is at least one argument.
takeXAppsAsList :: Exp a n -> [Exp a n]Source
Flatten an application into the function parts and arguments, if any.
takeXConApps :: Exp a n -> Maybe (DaCon n, [Exp a n])Source
Flatten an application of a data constructor into the constructor and its arguments.
Returns Nothing
if the expression isn't a constructor application.
takeXPrimApps :: Exp a n -> Maybe (n, [Exp a n])Source
Flatten an application of a primop into the variable and its arguments.
Returns Nothing
if the expression isn't a primop application.
Lets
splitXLets :: Exp a n -> ([Lets a n], Exp a n)Source
Split let-bindings from the front of an expression, if any.
bindsOfLets :: Lets a n -> ([Bind n], [Bind n])Source
Take the binds of a Lets
.
The level-1 and level-0 binders are returned separately.
specBindsOfLets :: Lets a n -> [Bind n]Source
Like bindsOfLets
but only take the spec (level-1) binders.
valwitBindsOfLets :: Lets a n -> [Bind n]Source
Like bindsOfLets
but only take the value and witness (level-0) binders.
Patterns
bindsOfPat :: Pat n -> [Bind n]Source
Take the binds of a Pat
.
Alternatives
takeCtorNameOfAlt :: Alt a n -> Maybe nSource
Take the constructor name of an alternative, if there is one.
Witnesses
wApps :: Witness a n -> [Witness a n] -> Witness a nSource
Construct a sequence of witness applications
takeXWitness :: Exp a n -> Maybe (Witness a n)Source
Take the witness from an XWitness
argument, if any.
takeWAppsAsList :: Witness a n -> [Witness a n]Source
Flatten an application into the function parts and arguments, if any.
takePrimWiConApps :: Witness a n -> Maybe (n, [Witness a n])Source
Flatten an application of a witness into the witness constructor name and its arguments.
Returns nothing if there is no witness constructor in head position.
Types
Data Constructors
takeNameOfDaCon :: DaCon n -> Maybe nSource
Take the name of data constructor, if there is one.
takeTypeOfDaCon :: DaCon n -> Maybe (Type n)Source
Take the type annotation of a data constructor, if we know it locally.