idris-0.9.15: Functional Programming Language with Dependent Types

Safe HaskellNone

Idris.REPL

Synopsis

Documentation

replSource

Arguments

:: IState

The initial state

-> [FilePath]

The loaded modules

-> InputT Idris () 

Run the REPL

startServer :: PortID -> IState -> [FilePath] -> Idris ()Source

Run the REPL seDver

processNetCmd :: IState -> IState -> Handle -> FilePath -> String -> IO (IState, FilePath)Source

runClient :: PortID -> String -> IO ()Source

Run a command on the server on localhost

ideslaveStart :: Bool -> IState -> [FilePath] -> Idris ()Source

Run the IdeSlave

ideslave :: Handle -> IState -> [FilePath] -> Idris ()Source

runIdeSlaveCommandSource

Arguments

:: Handle

^ The handle for communication

-> Integer

^ The continuation ID for the client

-> IState

^ The original IState

-> FilePath

^ The current open file

-> [FilePath]

^ The currently loaded modules

-> IdeSlaveCommand

^ The command to process

-> Idris () 

Run IDESlave commands

ideSlaveForceTermImplicits :: Handle -> Integer -> [(Name, Bool)] -> Bool -> Term -> Idris ()Source

Show a term for IDESlave with the specified implicitness

splitName :: String -> Either String NameSource

ideslaveProcess :: FilePath -> Command -> Idris ()Source

mkPrompt :: [FilePath] -> [Char]Source

The prompt consists of the currently loaded modules, or Idris if there are none

lit :: FilePath -> BoolSource

Determine whether a file uses literate syntax

processInput :: String -> IState -> [FilePath] -> Idris (Maybe [FilePath])Source

edit :: FilePath -> IState -> Idris ()Source

insertScript :: String -> [String] -> [String]Source

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

showTotalN :: IState -> Name -> StringSource

helphead :: [([[Char]], CmdArg, [Char])]Source

replSettings :: Maybe FilePath -> Settings IdrisSource

idris :: [Opt] -> IO (Maybe IState)Source

Invoke as if from command line. It is an error if there are unresolved totality problems.

loadInputs :: [FilePath] -> Maybe Int -> Idris ()Source

runMain :: Idris () -> IO ()Source

execScript :: String -> Idris ()Source

getIdrisUserDataDir :: Idris FilePathSource

Get the platform-specific, user-specific Idris dir

getInitScript :: Idris FilePathSource

Locate the platform-specific location for the init script

initScript :: Idris ()Source

Run the initialisation script

getFile :: Opt -> Maybe StringSource

getBC :: Opt -> Maybe StringSource

getOutput :: Opt -> Maybe StringSource

getIBCSubDir :: Opt -> Maybe StringSource

getImportDir :: Opt -> Maybe StringSource

getPkgDir :: Opt -> Maybe StringSource

getPkg :: Opt -> Maybe (Bool, String)Source

getPkgClean :: Opt -> Maybe StringSource

getPkgREPL :: Opt -> Maybe StringSource

getPkgCheck :: Opt -> Maybe StringSource

getPkgMkDocSource

Arguments

:: Opt

Opt to extract

-> Maybe String

Result

Returns None if given an Opt which is not PkgMkDoc Otherwise returns Just x, where x is the contents of PkgMkDoc

getPkgTestSource

Arguments

:: Opt

the option to extract

-> Maybe String

the package file to test

getExecScript :: Opt -> Maybe StringSource

getEvalExpr :: Opt -> Maybe StringSource

getTriple :: Opt -> Maybe StringSource

getCPU :: Opt -> Maybe StringSource

getOptLevel :: Opt -> Maybe IntSource

getColour :: Opt -> Maybe BoolSource

getClient :: Opt -> Maybe StringSource

opt :: (Opt -> Maybe a) -> [Opt] -> [a]Source

ver :: [Char]Source

banner :: [Char]Source

warranty :: [Char]Source