Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
HaskellCI
Description
New-style .travis.yml
script generator using cabal 1.24's nix-style
tech-preview facilities.
See also https://github.com/haskell-CI/haskell-ci
NB: This code deliberately avoids relying on non-standard packages and is expected to compile/work with at least GHC 7.0 through GHC 8.0
Synopsis
- main :: IO ()
- parseOptions :: [String] -> IO (FilePath, Options)
- data Options = Options {}
- defaultOptions :: Options
- data Config = Config {
- cfgCabalInstallVersion :: Maybe Version
- cfgJobs :: Maybe Jobs
- cfgUbuntu :: !Ubuntu
- cfgTestedWith :: !TestedWithJobs
- cfgEnabledJobs :: !VersionRange
- cfgCopyFields :: !CopyFields
- cfgLocalGhcOptions :: [String]
- cfgSubmodules :: !Bool
- cfgCache :: !Bool
- cfgInstallDeps :: !Bool
- cfgInstalled :: [Installed]
- cfgTests :: !VersionRange
- cfgRunTests :: !VersionRange
- cfgBenchmarks :: !VersionRange
- cfgHaddock :: !VersionRange
- cfgHaddockComponents :: !Components
- cfgNoTestsNoBench :: !VersionRange
- cfgUnconstrainted :: !VersionRange
- cfgHeadHackage :: !VersionRange
- cfgHeadHackageOverride :: !Bool
- cfgGhcjsTests :: !Bool
- cfgGhcjsTools :: ![PackageName]
- cfgTestOutputDirect :: !Bool
- cfgCheck :: !Bool
- cfgOnlyBranches :: [String]
- cfgIrcChannels :: [String]
- cfgIrcNickname :: Maybe String
- cfgIrcPassword :: Maybe String
- cfgIrcIfInOriginRepo :: Bool
- cfgEmailNotifications :: Bool
- cfgProjectName :: Maybe String
- cfgFolds :: Set Fold
- cfgGhcHead :: !Bool
- cfgPostgres :: !Bool
- cfgGoogleChrome :: !Bool
- cfgEnv :: Map Version String
- cfgAllowFailures :: !VersionRange
- cfgLastInSeries :: !Bool
- cfgLinuxJobs :: !VersionRange
- cfgMacosJobs :: !VersionRange
- cfgGhcupCabal :: !Bool
- cfgGhcupJobs :: !VersionRange
- cfgGhcupVersion :: !Version
- cfgApt :: Set String
- cfgTravisPatches :: [FilePath]
- cfgGitHubPatches :: [FilePath]
- cfgInsertVersion :: !Bool
- cfgErrorMissingMethods :: !PackageScope
- cfgDoctest :: !DoctestConfig
- cfgDocspec :: !DocspecConfig
- cfgHLint :: !HLintConfig
- cfgConstraintSets :: [ConstraintSet]
- cfgRawProject :: [PrettyField ()]
- cfgRawTravis :: !String
- cfgGitHubActionName :: !(Maybe String)
- cfgTimeoutMinutes :: !Natural
- newtype GitConfig = GitConfig {
- gitCfgRemotes :: Map Text Text
- data InputType
- runDiagnosticsT :: DiagnosticsT m a -> m (Maybe a, [String])
- bashFromConfigFile :: forall m. (MonadIO m, MonadDiagnostics m, MonadMask m) => [String] -> Options -> FilePath -> m ByteString
- travisFromConfigFile :: forall m. (MonadIO m, MonadDiagnostics m, MonadMask m) => [String] -> Options -> FilePath -> m ByteString
- githubFromConfigFile :: forall m. (MonadIO m, MonadDiagnostics m, MonadMask m) => [String] -> Options -> FilePath -> m ByteString
Documentation
for tests
Constructors
Options | |
Constructors
Instances
Constructors
GitConfig | |
Fields
|
Constructors
InputTypePackage | .cabal |
InputTypeProject | @cabal.project |
runDiagnosticsT :: DiagnosticsT m a -> m (Maybe a, [String]) Source #
Variants
bashFromConfigFile :: forall m. (MonadIO m, MonadDiagnostics m, MonadMask m) => [String] -> Options -> FilePath -> m ByteString Source #
travisFromConfigFile :: forall m. (MonadIO m, MonadDiagnostics m, MonadMask m) => [String] -> Options -> FilePath -> m ByteString Source #
githubFromConfigFile :: forall m. (MonadIO m, MonadDiagnostics m, MonadMask m) => [String] -> Options -> FilePath -> m ByteString Source #