module System.Nix.Store.Remote.Types.WorkerOp
( WorkerOp(..)
) where
import GHC.Generics (Generic)
data WorkerOp
= WorkerOp_Reserved_0__
| WorkerOp_IsValidPath
| WorkerOp_Reserved_2__
| WorkerOp_HasSubstitutes
| WorkerOp_QueryPathHash
| WorkerOp_QueryReferences
| WorkerOp_QueryReferrers
| WorkerOp_AddToStore
| WorkerOp_AddTextToStore
| WorkerOp_BuildPaths
| WorkerOp_EnsurePath
| WorkerOp_AddTempRoot
| WorkerOp_AddIndirectRoot
| WorkerOp_SyncWithGC
| WorkerOp_FindRoots
| WorkerOp_Reserved_15__
| WorkerOp_ExportPath
| WorkerOp_Reserved_17__
| WorkerOp_QueryDeriver
| WorkerOp_SetOptions
| WorkerOp_CollectGarbage
| WorkerOp_QuerySubstitutablePathInfo
| WorkerOp_QueryDerivationOutputs
| WorkerOp_QueryAllValidPaths
| WorkerOp_QueryFailedPaths
| WorkerOp_ClearFailedPaths
| WorkerOp_QueryPathInfo
| WorkerOp_ImportPaths
| WorkerOp_QueryDerivationOutputNames
| WorkerOp_QueryPathFromHashPart
| WorkerOp_QuerySubstitutablePathInfos
| WorkerOp_QueryValidPaths
| WorkerOp_QuerySubstitutablePaths
| WorkerOp_QueryValidDerivers
| WorkerOp_OptimiseStore
| WorkerOp_VerifyStore
| WorkerOp_BuildDerivation
| WorkerOp_AddSignatures
| WorkerOp_NarFromPath
| WorkerOp_AddToStoreNar
| WorkerOp_QueryMissing
| WorkerOp_QueryDerivationOutputMap
| WorkerOp_RegisterDrvOutput
| WorkerOp_QueryRealisation
| WorkerOp_AddMultipleToStore
| WorkerOp_AddBuildLog
| WorkerOp_BuildPathsWithResults
deriving (WorkerOp
WorkerOp -> WorkerOp -> Bounded WorkerOp
forall a. a -> a -> Bounded a
$cminBound :: WorkerOp
minBound :: WorkerOp
$cmaxBound :: WorkerOp
maxBound :: WorkerOp
Bounded, WorkerOp -> WorkerOp -> Bool
(WorkerOp -> WorkerOp -> Bool)
-> (WorkerOp -> WorkerOp -> Bool) -> Eq WorkerOp
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: WorkerOp -> WorkerOp -> Bool
== :: WorkerOp -> WorkerOp -> Bool
$c/= :: WorkerOp -> WorkerOp -> Bool
/= :: WorkerOp -> WorkerOp -> Bool
Eq, Int -> WorkerOp
WorkerOp -> Int
WorkerOp -> [WorkerOp]
WorkerOp -> WorkerOp
WorkerOp -> WorkerOp -> [WorkerOp]
WorkerOp -> WorkerOp -> WorkerOp -> [WorkerOp]
(WorkerOp -> WorkerOp)
-> (WorkerOp -> WorkerOp)
-> (Int -> WorkerOp)
-> (WorkerOp -> Int)
-> (WorkerOp -> [WorkerOp])
-> (WorkerOp -> WorkerOp -> [WorkerOp])
-> (WorkerOp -> WorkerOp -> [WorkerOp])
-> (WorkerOp -> WorkerOp -> WorkerOp -> [WorkerOp])
-> Enum WorkerOp
forall a.
(a -> a)
-> (a -> a)
-> (Int -> a)
-> (a -> Int)
-> (a -> [a])
-> (a -> a -> [a])
-> (a -> a -> [a])
-> (a -> a -> a -> [a])
-> Enum a
$csucc :: WorkerOp -> WorkerOp
succ :: WorkerOp -> WorkerOp
$cpred :: WorkerOp -> WorkerOp
pred :: WorkerOp -> WorkerOp
$ctoEnum :: Int -> WorkerOp
toEnum :: Int -> WorkerOp
$cfromEnum :: WorkerOp -> Int
fromEnum :: WorkerOp -> Int
$cenumFrom :: WorkerOp -> [WorkerOp]
enumFrom :: WorkerOp -> [WorkerOp]
$cenumFromThen :: WorkerOp -> WorkerOp -> [WorkerOp]
enumFromThen :: WorkerOp -> WorkerOp -> [WorkerOp]
$cenumFromTo :: WorkerOp -> WorkerOp -> [WorkerOp]
enumFromTo :: WorkerOp -> WorkerOp -> [WorkerOp]
$cenumFromThenTo :: WorkerOp -> WorkerOp -> WorkerOp -> [WorkerOp]
enumFromThenTo :: WorkerOp -> WorkerOp -> WorkerOp -> [WorkerOp]
Enum, (forall x. WorkerOp -> Rep WorkerOp x)
-> (forall x. Rep WorkerOp x -> WorkerOp) -> Generic WorkerOp
forall x. Rep WorkerOp x -> WorkerOp
forall x. WorkerOp -> Rep WorkerOp x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. WorkerOp -> Rep WorkerOp x
from :: forall x. WorkerOp -> Rep WorkerOp x
$cto :: forall x. Rep WorkerOp x -> WorkerOp
to :: forall x. Rep WorkerOp x -> WorkerOp
Generic, Eq WorkerOp
Eq WorkerOp =>
(WorkerOp -> WorkerOp -> Ordering)
-> (WorkerOp -> WorkerOp -> Bool)
-> (WorkerOp -> WorkerOp -> Bool)
-> (WorkerOp -> WorkerOp -> Bool)
-> (WorkerOp -> WorkerOp -> Bool)
-> (WorkerOp -> WorkerOp -> WorkerOp)
-> (WorkerOp -> WorkerOp -> WorkerOp)
-> Ord WorkerOp
WorkerOp -> WorkerOp -> Bool
WorkerOp -> WorkerOp -> Ordering
WorkerOp -> WorkerOp -> WorkerOp
forall a.
Eq a =>
(a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
$ccompare :: WorkerOp -> WorkerOp -> Ordering
compare :: WorkerOp -> WorkerOp -> Ordering
$c< :: WorkerOp -> WorkerOp -> Bool
< :: WorkerOp -> WorkerOp -> Bool
$c<= :: WorkerOp -> WorkerOp -> Bool
<= :: WorkerOp -> WorkerOp -> Bool
$c> :: WorkerOp -> WorkerOp -> Bool
> :: WorkerOp -> WorkerOp -> Bool
$c>= :: WorkerOp -> WorkerOp -> Bool
>= :: WorkerOp -> WorkerOp -> Bool
$cmax :: WorkerOp -> WorkerOp -> WorkerOp
max :: WorkerOp -> WorkerOp -> WorkerOp
$cmin :: WorkerOp -> WorkerOp -> WorkerOp
min :: WorkerOp -> WorkerOp -> WorkerOp
Ord, Int -> WorkerOp -> ShowS
[WorkerOp] -> ShowS
WorkerOp -> String
(Int -> WorkerOp -> ShowS)
-> (WorkerOp -> String) -> ([WorkerOp] -> ShowS) -> Show WorkerOp
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> WorkerOp -> ShowS
showsPrec :: Int -> WorkerOp -> ShowS
$cshow :: WorkerOp -> String
show :: WorkerOp -> String
$cshowList :: [WorkerOp] -> ShowS
showList :: [WorkerOp] -> ShowS
Show, ReadPrec [WorkerOp]
ReadPrec WorkerOp
Int -> ReadS WorkerOp
ReadS [WorkerOp]
(Int -> ReadS WorkerOp)
-> ReadS [WorkerOp]
-> ReadPrec WorkerOp
-> ReadPrec [WorkerOp]
-> Read WorkerOp
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
$creadsPrec :: Int -> ReadS WorkerOp
readsPrec :: Int -> ReadS WorkerOp
$creadList :: ReadS [WorkerOp]
readList :: ReadS [WorkerOp]
$creadPrec :: ReadPrec WorkerOp
readPrec :: ReadPrec WorkerOp
$creadListPrec :: ReadPrec [WorkerOp]
readListPrec :: ReadPrec [WorkerOp]
Read)