Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
GHCup.OptParse.Run
Documentation
data RunOptions Source #
Constructors
RunOptions | |
Fields
|
Instances
Show RunOptions Source # | |
Defined in GHCup.OptParse.Run Methods showsPrec :: Int -> RunOptions -> ShowS # show :: RunOptions -> String # showList :: [RunOptions] -> ShowS # | |
Eq RunOptions Source # | |
Defined in GHCup.OptParse.Run |
type RunEffects = '[AlreadyInstalled, UnknownArchive, ArchiveResult, FileDoesNotExistError, CopyError, NotInstalled, DirNotEmpty, NoDownload, NotInstalled, BuildFailed, TagNotFound, DayNotFound, DigestError, ContentLengthError, GPGError, DownloadFailed, TarDirDoesNotExist, NextVerNotFound, NoToolVersionSet, FileAlreadyExistsError, ProcessError, UninstallFailed, MergeFileTreeError, NoCompatiblePlatform, ParseError, UnsupportedSetupCombo, DistroNotFound, NoCompatibleArch, URIParseError] Source #
runLeanRUN :: (MonadUnliftIO m, MonadIO m) => LeanAppState -> Excepts RunEffects (ReaderT LeanAppState m) a -> m (VEither RunEffects a) Source #
runRUN :: MonadUnliftIO m => IO AppState -> Excepts RunEffects (ResourceT (ReaderT AppState m)) a -> m (VEither RunEffects a) Source #
run :: forall m. (MonadFail m, MonadMask m, MonadCatch m, MonadIO m, MonadUnliftIO m, Alternative m) => RunOptions -> Settings -> IO AppState -> LeanAppState -> (ReaderT LeanAppState m () -> m ()) -> m ExitCode Source #
Constructors
Toolchain | |