Safe Haskell | Safe-Infered |
---|
- egisonVersion :: String
- showBanner :: IO ()
- showByebyeMessage :: IO ()
- loadLibraries :: Env -> IO ()
- escapeBackslashes :: String -> String
- evalString :: Env -> String -> IO String
- evalMain :: Env -> [String] -> IOThrowsError EgisonVal
- evalTopExpr :: Env -> TopExpr -> IOThrowsError String
- load :: Env -> String -> IOThrowsError ()
- eval :: Env -> EgisonExpr -> IOThrowsError EgisonVal
- iEval :: IntermidiateVal -> IOThrowsError EgisonVal
- innerRefsEval :: [InnerValRef] -> IOThrowsError [EgisonVal]
- cRefEval :: ObjectRef -> IOThrowsError EgisonVal
- cRefEval1 :: ObjectRef -> IOThrowsError Object
- cEval :: Object -> IOThrowsError EgisonVal
- cEval1 :: Object -> IOThrowsError Object
- cApply :: ObjectRef -> ObjectRef -> IOThrowsError EgisonVal
- cApply1 :: ObjectRef -> ObjectRef -> IOThrowsError Object
- expandLoop :: Env -> Object -> IOThrowsError Object
- extendLet :: Env -> [(EgisonExpr, EgisonExpr)] -> IOThrowsError Env
- makeFrame :: ObjectRef -> ObjectRef -> IOThrowsError FrameList
- tupleExprToExprList :: EgisonExpr -> ThrowsError [EgisonExpr]
- innerExprsToExprList :: [InnerExpr] -> ThrowsError [EgisonExpr]
- innerValRefsToObjRefs :: [InnerValRef] -> IOThrowsError [ObjectRef]
- patternMatch :: MatchFlag -> [MState] -> IOThrowsError [FrameList]
- inductiveMatch :: DestructInfo -> ObjectRef -> ObjectRef -> IOThrowsError ([ObjectRef], [ObjectRef], [[ObjectRef]])
- primitivePatPatternMatch :: PrimitivePatPattern -> ObjectRef -> IOThrowsError (Maybe ([ObjectRef], FrameList))
- primitivePatPatternMatchList :: [PrimitivePatPattern] -> [ObjectRef] -> IOThrowsError (Maybe ([ObjectRef], FrameList))
- primitivePatternMatch :: PrimitivePattern -> ObjectRef -> IOThrowsError (Maybe FrameList)
- primitivePatternMatchList :: [PrimitivePattern] -> [ObjectRef] -> IOThrowsError (Maybe FrameList)
- objectRefToInnerRefs :: ObjectRef -> IOThrowsError [InnerValRef]
- isEmptyCollection :: ObjectRef -> IOThrowsError Bool
- isEmptyCollectionForSnoc :: ObjectRef -> IOThrowsError Bool
- consDestruct :: ObjectRef -> IOThrowsError (ObjectRef, ObjectRef)
- snocDestruct :: ObjectRef -> IOThrowsError (ObjectRef, ObjectRef)
- collectionToObjRefs :: ObjectRef -> IOThrowsError [ObjectRef]
- tupleToObjRefs :: ObjectRef -> IOThrowsError [ObjectRef]
- innerRefsToObjRefs :: [InnerValRef] -> IOThrowsError [ObjectRef]
- primitiveBindings :: IO Env
- constants :: [(String, EgisonVal)]
- ioPrimitives :: [(String, [EgisonVal] -> IOThrowsError EgisonVal)]
- primitives :: [(String, [EgisonVal] -> ThrowsError EgisonVal)]
Documentation
showBanner :: IO ()Source
A utility function to display the egison console banner
showByebyeMessage :: IO ()Source
A utility function to display the egison console byebye message
loadLibraries :: Env -> IO ()Source
Load standard libraries into the given environment
escapeBackslashes :: String -> StringSource
A utility function to escape backslashes in the given string
evalTopExpr :: Env -> TopExpr -> IOThrowsError StringSource
Evaluate egison top expression that has already been loaded into haskell
eval :: Env -> EgisonExpr -> IOThrowsError EgisonValSource
Evaluate egison expression that has already been loaded into haskell
innerRefsEval :: [InnerValRef] -> IOThrowsError [EgisonVal]Source
expandLoop :: Env -> Object -> IOThrowsError ObjectSource
:: Env | Environment |
-> [(EgisonExpr, EgisonExpr)] | Extensions to the environment |
-> IOThrowsError Env | Extended environment |
patternMatch :: MatchFlag -> [MState] -> IOThrowsError [FrameList]Source
inductiveMatch :: DestructInfo -> ObjectRef -> ObjectRef -> IOThrowsError ([ObjectRef], [ObjectRef], [[ObjectRef]])Source
primitivePatPatternMatch :: PrimitivePatPattern -> ObjectRef -> IOThrowsError (Maybe ([ObjectRef], FrameList))Source
primitivePatPatternMatchList :: [PrimitivePatPattern] -> [ObjectRef] -> IOThrowsError (Maybe ([ObjectRef], FrameList))Source
primitivePatternMatchList :: [PrimitivePattern] -> [ObjectRef] -> IOThrowsError (Maybe FrameList)Source
ioPrimitives :: [(String, [EgisonVal] -> IOThrowsError EgisonVal)]Source
primitives :: [(String, [EgisonVal] -> ThrowsError EgisonVal)]Source