Safe Haskell | None |
---|---|
Language | GHC2021 |
Hix.Managed.Build.NixOutput
Documentation
data Derivation Source #
Instances
data PackageDerivation Source #
Instances
Generic PackageDerivation Source # | |||||
Defined in Hix.Managed.Build.NixOutput Associated Types
Methods from :: PackageDerivation -> Rep PackageDerivation x # to :: Rep PackageDerivation x -> PackageDerivation # | |||||
Show PackageDerivation Source # | |||||
Defined in Hix.Managed.Build.NixOutput Methods showsPrec :: Int -> PackageDerivation -> ShowS # show :: PackageDerivation -> String # showList :: [PackageDerivation] -> ShowS # | |||||
Eq PackageDerivation Source # | |||||
Defined in Hix.Managed.Build.NixOutput Methods (==) :: PackageDerivation -> PackageDerivation -> Bool # (/=) :: PackageDerivation -> PackageDerivation -> Bool # | |||||
type Rep PackageDerivation Source # | |||||
Defined in Hix.Managed.Build.NixOutput type Rep PackageDerivation = D1 ('MetaData "PackageDerivation" "Hix.Managed.Build.NixOutput" "hix-0.8.0-HgAAo9T3AqQBueO4fzYR2Q" 'False) (C1 ('MetaCons "PackageDerivation" 'PrefixI 'True) (S1 ('MetaSel ('Just "package") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 PackageId) :*: (S1 ('MetaSel ('Just "success") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Bool) :*: S1 ('MetaSel ('Just "log") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Text])))) |
data BuildsState Source #
Constructors
BuildsState | |
Instances
Generic BuildsState Source # | |||||
Defined in Hix.Managed.Build.NixOutput Associated Types
| |||||
Show BuildsState Source # | |||||
Defined in Hix.Managed.Build.NixOutput Methods showsPrec :: Int -> BuildsState -> ShowS # show :: BuildsState -> String # showList :: [BuildsState] -> ShowS # | |||||
Eq BuildsState Source # | |||||
Defined in Hix.Managed.Build.NixOutput | |||||
type Rep BuildsState Source # | |||||
Defined in Hix.Managed.Build.NixOutput type Rep BuildsState = D1 ('MetaData "BuildsState" "Hix.Managed.Build.NixOutput" "hix-0.8.0-HgAAo9T3AqQBueO4fzYR2Q" 'False) (C1 ('MetaCons "BuildsState" 'PrefixI 'True) ((S1 ('MetaSel ('Just "id") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Integer) :*: S1 ('MetaSel ('Just "done") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int)) :*: (S1 ('MetaSel ('Just "failed") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int) :*: S1 ('MetaSel ('Just "unassigned") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Bool])))) |
data OutputState Source #
Constructors
OutputState | |
Fields
|
Instances
Generic OutputState Source # | |||||
Defined in Hix.Managed.Build.NixOutput Associated Types
| |||||
Show OutputState Source # | |||||
Defined in Hix.Managed.Build.NixOutput Methods showsPrec :: Int -> OutputState -> ShowS # show :: OutputState -> String # showList :: [OutputState] -> ShowS # | |||||
Default OutputState Source # | |||||
Defined in Hix.Managed.Build.NixOutput Methods def :: OutputState # | |||||
Eq OutputState Source # | |||||
Defined in Hix.Managed.Build.NixOutput | |||||
type Rep OutputState Source # | |||||
Defined in Hix.Managed.Build.NixOutput type Rep OutputState = D1 ('MetaData "OutputState" "Hix.Managed.Build.NixOutput" "hix-0.8.0-HgAAo9T3AqQBueO4fzYR2Q" 'False) (C1 ('MetaCons "OutputState" 'PrefixI 'True) (S1 ('MetaSel ('Just "builds") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe BuildsState)) :*: (S1 ('MetaSel ('Just "running") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Map Integer Derivation)) :*: S1 ('MetaSel ('Just "finished") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [PackageDerivation])))) |
data OutputResult Source #
Constructors
OutputResult | |
Fields |
Instances
Generic OutputResult Source # | |||||
Defined in Hix.Managed.Build.NixOutput Associated Types
| |||||
Show OutputResult Source # | |||||
Defined in Hix.Managed.Build.NixOutput Methods showsPrec :: Int -> OutputResult -> ShowS # show :: OutputResult -> String # showList :: [OutputResult] -> ShowS # | |||||
Eq OutputResult Source # | |||||
Defined in Hix.Managed.Build.NixOutput | |||||
type Rep OutputResult Source # | |||||
Defined in Hix.Managed.Build.NixOutput type Rep OutputResult = D1 ('MetaData "OutputResult" "Hix.Managed.Build.NixOutput" "hix-0.8.0-HgAAo9T3AqQBueO4fzYR2Q" 'False) (C1 ('MetaCons "OutputResult" 'PrefixI 'True) (S1 ('MetaSel ('Just "failedPackages") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe (NonEmpty PackageDerivation))))) |
runOutputState :: Monad m => StateT OutputState m a -> m (a, OutputResult) Source #
Constructors
NixResult | |
NixStartBuilds Integer | |
NixStart Integer Text | |
NixStop Integer | |
NixStartOther Integer | |
NixMessage |
Instances
FromJSON NixAction Source # | |||||
Defined in Hix.Managed.Build.NixOutput | |||||
Generic NixAction Source # | |||||
Defined in Hix.Managed.Build.NixOutput Associated Types
| |||||
Show NixAction Source # | |||||
Eq NixAction Source # | |||||
type Rep NixAction Source # | |||||
Defined in Hix.Managed.Build.NixOutput type Rep NixAction = D1 ('MetaData "NixAction" "Hix.Managed.Build.NixOutput" "hix-0.8.0-HgAAo9T3AqQBueO4fzYR2Q" 'False) ((C1 ('MetaCons "NixResult" 'PrefixI 'True) (S1 ('MetaSel ('Just "aid") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Integer) :*: (S1 ('MetaSel ('Just "rtype") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int) :*: S1 ('MetaSel ('Just "fields") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Either Text Int]))) :+: (C1 ('MetaCons "NixStartBuilds" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Integer)) :+: C1 ('MetaCons "NixStart" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Integer) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Text)))) :+: (C1 ('MetaCons "NixStop" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Integer)) :+: (C1 ('MetaCons "NixStartOther" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Integer)) :+: C1 ('MetaCons "NixMessage" 'PrefixI 'False) (U1 :: Type -> Type)))) |
newtype StorePathName Source #
Constructors
StorePathName String |
Instances
Parsec StorePathName Source # | |||||
Defined in Hix.Managed.Build.NixOutput Methods parsec :: CabalParsing m => m StorePathName # | |||||
Generic StorePathName Source # | |||||
Defined in Hix.Managed.Build.NixOutput Associated Types
| |||||
Show StorePathName Source # | |||||
Defined in Hix.Managed.Build.NixOutput Methods showsPrec :: Int -> StorePathName -> ShowS # show :: StorePathName -> String # showList :: [StorePathName] -> ShowS # | |||||
Eq StorePathName Source # | |||||
Defined in Hix.Managed.Build.NixOutput Methods (==) :: StorePathName -> StorePathName -> Bool # (/=) :: StorePathName -> StorePathName -> Bool # | |||||
type Rep StorePathName Source # | |||||
Defined in Hix.Managed.Build.NixOutput type Rep StorePathName = D1 ('MetaData "StorePathName" "Hix.Managed.Build.NixOutput" "hix-0.8.0-HgAAo9T3AqQBueO4fzYR2Q" 'True) (C1 ('MetaCons "StorePathName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))) |
addLogMessage :: Text -> Derivation -> Derivation Source #
finish :: Bool -> Derivation -> Either String PackageDerivation Source #
tryFinish :: Maybe BuildsState -> Maybe Derivation -> (Maybe (Either Derivation PackageDerivation), [PackageDerivation], Maybe BuildsState) Source #
updateBuilds :: [Either Text Int] -> OutputState -> OutputState Source #
processResult :: Integer -> Int -> [Either Text Int] -> OutputState -> OutputState Source #
processMessage :: ByteString -> NixAction -> StateT OutputState M () Source #
outputParse :: ByteString -> StateT OutputState M () Source #