Safe Haskell | None |
---|---|
Language | Haskell2010 |
- parseCore :: BoundVars c => CoreString -> c -> HermitM CoreExpr
- parseCoreExprT :: (BoundVars c, HasDebugChan m, HasHermitMEnv m, HasLemmas m, HasStash m, LiftCoreM m) => CoreString -> Transform c m a CoreExpr
- parse2BeforeT :: (BoundVars c, HasDebugChan m, HasHermitMEnv m, HasLemmas m, HasStash m, LiftCoreM m) => (CoreExpr -> CoreExpr -> Translate c m a b) -> CoreString -> CoreString -> Translate c m a b
- parse3BeforeT :: (BoundVars c, HasDebugChan m, HasHermitMEnv m, HasLemmas m, HasStash m, LiftCoreM m) => (CoreExpr -> CoreExpr -> CoreExpr -> Translate c m a b) -> CoreString -> CoreString -> CoreString -> Translate c m a b
- parse2beforeBiR :: (CoreExpr -> CoreExpr -> BiRewriteH a) -> CoreString -> CoreString -> BiRewriteH a
- parse3beforeBiR :: (CoreExpr -> CoreExpr -> CoreExpr -> BiRewriteH a) -> CoreString -> CoreString -> CoreString -> BiRewriteH a
- parse4beforeBiR :: (CoreExpr -> CoreExpr -> CoreExpr -> CoreExpr -> BiRewriteH a) -> CoreString -> CoreString -> CoreString -> CoreString -> BiRewriteH a
- parse5beforeBiR :: (CoreExpr -> CoreExpr -> CoreExpr -> CoreExpr -> CoreExpr -> BiRewriteH a) -> CoreString -> CoreString -> CoreString -> CoreString -> CoreString -> BiRewriteH a
- data Token
- = Tforall
- | Trec
- | Tlet
- | Tin
- | Tcase
- | Tof
- | Tcast
- | Tnote
- | Texternal
- | Tlocal
- | Twild
- | Toparen
- | Tcparen
- | Tobrace
- | Tcbrace
- | Thash
- | Teq
- | Tcolon
- | Tcoloncolon
- | Tcoloneqcolon
- | Tstar
- | Tarrow
- | Tdoublearrow
- | Tlambda
- | Tat
- | Tdot
- | Tquestion
- | Tsemicolon
- | Tname String
- | Tcname String
- | Tinteger Integer
- | Trational Float
- | Tstring String
- | Tchar Char
- parseError :: Monad m => [Token] -> m a
- lexer :: String -> Either String [Token]
Documentation
parseCoreExprT :: (BoundVars c, HasDebugChan m, HasHermitMEnv m, HasLemmas m, HasStash m, LiftCoreM m) => CoreString -> Transform c m a CoreExpr Source
Parse a CoreString
to a CoreExpr
, using the current context.
parse2BeforeT :: (BoundVars c, HasDebugChan m, HasHermitMEnv m, HasLemmas m, HasStash m, LiftCoreM m) => (CoreExpr -> CoreExpr -> Translate c m a b) -> CoreString -> CoreString -> Translate c m a b Source
parse3BeforeT :: (BoundVars c, HasDebugChan m, HasHermitMEnv m, HasLemmas m, HasStash m, LiftCoreM m) => (CoreExpr -> CoreExpr -> CoreExpr -> Translate c m a b) -> CoreString -> CoreString -> CoreString -> Translate c m a b Source
parse2beforeBiR :: (CoreExpr -> CoreExpr -> BiRewriteH a) -> CoreString -> CoreString -> BiRewriteH a Source
parse3beforeBiR :: (CoreExpr -> CoreExpr -> CoreExpr -> BiRewriteH a) -> CoreString -> CoreString -> CoreString -> BiRewriteH a Source
parse4beforeBiR :: (CoreExpr -> CoreExpr -> CoreExpr -> CoreExpr -> BiRewriteH a) -> CoreString -> CoreString -> CoreString -> CoreString -> BiRewriteH a Source
parse5beforeBiR :: (CoreExpr -> CoreExpr -> CoreExpr -> CoreExpr -> CoreExpr -> BiRewriteH a) -> CoreString -> CoreString -> CoreString -> CoreString -> CoreString -> BiRewriteH a Source
parseError :: Monad m => [Token] -> m a Source