{-# LANGUAGE DeriveAnyClass #-}

module Hercules.API.Agent.Evaluate.EvaluateEvent.PushedAll where

import Hercules.API.Prelude

-- | Indicates that all derivations have been pushed to a cache.
data PushedAll = PushedAll
  { PushedAll -> Text
cache :: Text
  }
  deriving ((forall x. PushedAll -> Rep PushedAll x)
-> (forall x. Rep PushedAll x -> PushedAll) -> Generic PushedAll
forall x. Rep PushedAll x -> PushedAll
forall x. PushedAll -> Rep PushedAll x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. PushedAll -> Rep PushedAll x
from :: forall x. PushedAll -> Rep PushedAll x
$cto :: forall x. Rep PushedAll x -> PushedAll
to :: forall x. Rep PushedAll x -> PushedAll
Generic, Int -> PushedAll -> ShowS
[PushedAll] -> ShowS
PushedAll -> String
(Int -> PushedAll -> ShowS)
-> (PushedAll -> String)
-> ([PushedAll] -> ShowS)
-> Show PushedAll
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> PushedAll -> ShowS
showsPrec :: Int -> PushedAll -> ShowS
$cshow :: PushedAll -> String
show :: PushedAll -> String
$cshowList :: [PushedAll] -> ShowS
showList :: [PushedAll] -> ShowS
Show, PushedAll -> PushedAll -> Bool
(PushedAll -> PushedAll -> Bool)
-> (PushedAll -> PushedAll -> Bool) -> Eq PushedAll
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: PushedAll -> PushedAll -> Bool
== :: PushedAll -> PushedAll -> Bool
$c/= :: PushedAll -> PushedAll -> Bool
/= :: PushedAll -> PushedAll -> Bool
Eq, PushedAll -> ()
(PushedAll -> ()) -> NFData PushedAll
forall a. (a -> ()) -> NFData a
$crnf :: PushedAll -> ()
rnf :: PushedAll -> ()
NFData, [PushedAll] -> Value
[PushedAll] -> Encoding
PushedAll -> Value
PushedAll -> Encoding
(PushedAll -> Value)
-> (PushedAll -> Encoding)
-> ([PushedAll] -> Value)
-> ([PushedAll] -> Encoding)
-> ToJSON PushedAll
forall a.
(a -> Value)
-> (a -> Encoding)
-> ([a] -> Value)
-> ([a] -> Encoding)
-> ToJSON a
$ctoJSON :: PushedAll -> Value
toJSON :: PushedAll -> Value
$ctoEncoding :: PushedAll -> Encoding
toEncoding :: PushedAll -> Encoding
$ctoJSONList :: [PushedAll] -> Value
toJSONList :: [PushedAll] -> Value
$ctoEncodingList :: [PushedAll] -> Encoding
toEncodingList :: [PushedAll] -> Encoding
ToJSON, Value -> Parser [PushedAll]
Value -> Parser PushedAll
(Value -> Parser PushedAll)
-> (Value -> Parser [PushedAll]) -> FromJSON PushedAll
forall a.
(Value -> Parser a) -> (Value -> Parser [a]) -> FromJSON a
$cparseJSON :: Value -> Parser PushedAll
parseJSON :: Value -> Parser PushedAll
$cparseJSONList :: Value -> Parser [PushedAll]
parseJSONList :: Value -> Parser [PushedAll]
FromJSON)