idris-0.9.15: Functional Programming Language with Dependent Types

Safe HaskellNone

Idris.IBC

Documentation

data IBCFile Source

Constructors

IBCFile 

Fields

ver :: Word8
 
sourcefile :: FilePath
 
symbols :: [Name]
 
ibc_imports :: [FilePath]
 
ibc_importdirs :: [FilePath]
 
ibc_implicits :: [(Name, [PArg])]
 
ibc_fixes :: [FixDecl]
 
ibc_statics :: [(Name, [Bool])]
 
ibc_classes :: [(Name, ClassInfo)]
 
ibc_instances :: [(Bool, Name, Name)]
 
ibc_dsls :: [(Name, DSL)]
 
ibc_datatypes :: [(Name, TypeInfo)]
 
ibc_optimise :: [(Name, OptInfo)]
 
ibc_syntax :: [Syntax]
 
ibc_keywords :: [String]
 
ibc_objs :: [(Codegen, FilePath)]
 
ibc_libs :: [(Codegen, String)]
 
ibc_cgflags :: [(Codegen, String)]
 
ibc_dynamic_libs :: [String]
 
ibc_hdrs :: [(Codegen, String)]
 
ibc_access :: [(Name, Accessibility)]
 
ibc_total :: [(Name, Totality)]
 
ibc_totcheckfail :: [(FC, String)]
 
ibc_flags :: [(Name, [FnOpt])]
 
ibc_fninfo :: [(Name, FnInfo)]
 
ibc_cg :: [(Name, CGInfo)]
 
ibc_defs :: [(Name, Def)]
 
ibc_docstrings :: [(Name, (Docstring DocTerm, [(Name, Docstring DocTerm)]))]
 
ibc_transforms :: [(Name, (Term, Term))]
 
ibc_errRev :: [(Term, Term)]
 
ibc_coercions :: [Name]
 
ibc_lineapps :: [(FilePath, Int, PTerm)]
 
ibc_namehints :: [(Name, Name)]
 
ibc_metainformation :: [(Name, MetaInformation)]
 
ibc_errorhandlers :: [Name]
 
ibc_function_errorhandlers :: [(Name, Name, Name)]
 
ibc_metavars :: [(Name, (Maybe Name, Int, Bool))]
 
ibc_patdefs :: [(Name, ([([Name], Term, Term)], [PTerm]))]
 
ibc_postulates :: [Name]
 
ibc_parsedSpan :: Maybe FC
 

Instances

loadIBC :: FilePath -> Idris ()Source

bencode :: Binary a => FilePath -> a -> IO ()Source

bdecode :: Binary b => FilePath -> IO bSource

writeIBC :: FilePath -> FilePath -> Idris ()Source

process :: IBCFile -> FilePath -> Idris ()Source

timestampOlder :: FilePath -> FilePath -> Idris ()Source

pParsedSpan :: Maybe FC -> Idris ()Source

pImportDirs :: [FilePath] -> Idris ()Source

pImports :: [FilePath] -> Idris ()Source

pImps :: [(Name, [PArg])] -> Idris ()Source

pStatics :: [(Name, [Bool])] -> Idris ()Source

pInstances :: [(Bool, Name, Name)] -> Idris ()Source

pDSLs :: [(Name, DSL)] -> Idris ()Source

pKeywords :: [String] -> Idris ()Source

pObjs :: [(Codegen, FilePath)] -> Idris ()Source

pLibs :: [(Codegen, String)] -> Idris ()Source

pCGFlags :: [(Codegen, String)] -> Idris ()Source

pDyLibs :: [String] -> Idris ()Source

pHdrs :: [(Codegen, String)] -> Idris ()Source

pPatdefs :: [(Name, ([([Name], Term, Term)], [PTerm]))] -> Idris ()Source

pDefs :: [Name] -> [(Name, Def)] -> Idris ()Source

pFlags :: [(Name, [FnOpt])] -> Idris ()Source

pTotCheckErr :: [(FC, String)] -> Idris ()Source

pCG :: [(Name, CGInfo)] -> Idris ()Source

pTrans :: [(Name, (Term, Term))] -> Idris ()Source

pLineApps :: [(FilePath, Int, PTerm)] -> Idris ()Source

pMetavars :: [(Name, (Maybe Name, Int, Bool))] -> Idris ()Source

safeToEnum :: (Enum a, Bounded a, Integral int) => String -> int -> aSource