idris-0.9.11.1: Functional Programming Language with Dependent Types

Safe HaskellNone

Idris.AbsSyntax

Contents

Synopsis

Documentation

forCodegen :: Codegen -> [(Codegen, a)] -> [a]Source

addFunctionErrorHandlers :: Name -> Name -> [Name] -> Idris ()Source

Adds error handlers for a particular function and argument. If names are is ambiguous, all matching handlers are updated.

runIO :: IO a -> Idris aSource

A version of liftIO that puts errors into the exception type of the Idris monad

consoleDisplayAnnotated :: Handle -> Doc OutputAnnotation -> Idris ()Source

Write a pretty-printed term to the console with semantic coloring

ideSlaveReturnAnnotated :: Integer -> Handle -> Doc OutputAnnotation -> Idris ()Source

Write pretty-printed output to IDESlave with semantic annotations

ihPrintFunTypes :: Handle -> Name -> [(Name, PTerm)] -> Idris ()Source

Pretty-print a collection of overloadings to REPL or IDESlave - corresponds to :t name

expandParams :: (Name -> Name) -> [(Name, PTerm)] -> [Name] -> [Name] -> PTerm -> PTermSource

expandParamsD :: Bool -> IState -> (Name -> Name) -> [(Name, PTerm)] -> [Name] -> PDecl -> PDeclSource

mapsnd :: (t -> t2) -> (t1, t) -> (t1, t2)Source

if it's just a type variable or concrete type, do it early (0)

if there's only type variables and injective constructors, do it next (1)

if there's a function type, next (2)

finally, everything else (3)

addImpl' :: Bool -> [Name] -> [Name] -> IState -> PTerm -> PTermSource

aiFn :: Bool -> Bool -> IState -> FC -> Name -> [[Text]] -> [PArg] -> Either Err PTermSource

mkPApp :: FC -> Int -> PTerm -> [PArg] -> PTermSource

data EitherErr a b Source

Constructors

LeftErr a 
RightOK b 

Instances