{-# LANGUAGE DeriveAnyClass #-} module Hercules.Agent.WorkerProtocol.Event.Attribute where import Data.Binary import Protolude import Prelude () data AttributeType = Regular | MustFail | MayFail | DependenciesOnly | Effect deriving ((forall x. AttributeType -> Rep AttributeType x) -> (forall x. Rep AttributeType x -> AttributeType) -> Generic AttributeType forall x. Rep AttributeType x -> AttributeType forall x. AttributeType -> Rep AttributeType x forall a. (forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a $cto :: forall x. Rep AttributeType x -> AttributeType $cfrom :: forall x. AttributeType -> Rep AttributeType x Generic, Get AttributeType [AttributeType] -> Put AttributeType -> Put (AttributeType -> Put) -> Get AttributeType -> ([AttributeType] -> Put) -> Binary AttributeType forall t. (t -> Put) -> Get t -> ([t] -> Put) -> Binary t putList :: [AttributeType] -> Put $cputList :: [AttributeType] -> Put get :: Get AttributeType $cget :: Get AttributeType put :: AttributeType -> Put $cput :: AttributeType -> Put Binary, Int -> AttributeType -> ShowS [AttributeType] -> ShowS AttributeType -> String (Int -> AttributeType -> ShowS) -> (AttributeType -> String) -> ([AttributeType] -> ShowS) -> Show AttributeType forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [AttributeType] -> ShowS $cshowList :: [AttributeType] -> ShowS show :: AttributeType -> String $cshow :: AttributeType -> String showsPrec :: Int -> AttributeType -> ShowS $cshowsPrec :: Int -> AttributeType -> ShowS Show, AttributeType -> AttributeType -> Bool (AttributeType -> AttributeType -> Bool) -> (AttributeType -> AttributeType -> Bool) -> Eq AttributeType forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: AttributeType -> AttributeType -> Bool $c/= :: AttributeType -> AttributeType -> Bool == :: AttributeType -> AttributeType -> Bool $c== :: AttributeType -> AttributeType -> Bool Eq) data Attribute = Attribute { Attribute -> [ByteString] path :: [ByteString], Attribute -> ByteString drv :: ByteString, Attribute -> AttributeType typ :: AttributeType } deriving ((forall x. Attribute -> Rep Attribute x) -> (forall x. Rep Attribute x -> Attribute) -> Generic Attribute forall x. Rep Attribute x -> Attribute forall x. Attribute -> Rep Attribute x forall a. (forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a $cto :: forall x. Rep Attribute x -> Attribute $cfrom :: forall x. Attribute -> Rep Attribute x Generic, Get Attribute [Attribute] -> Put Attribute -> Put (Attribute -> Put) -> Get Attribute -> ([Attribute] -> Put) -> Binary Attribute forall t. (t -> Put) -> Get t -> ([t] -> Put) -> Binary t putList :: [Attribute] -> Put $cputList :: [Attribute] -> Put get :: Get Attribute $cget :: Get Attribute put :: Attribute -> Put $cput :: Attribute -> Put Binary, Int -> Attribute -> ShowS [Attribute] -> ShowS Attribute -> String (Int -> Attribute -> ShowS) -> (Attribute -> String) -> ([Attribute] -> ShowS) -> Show Attribute forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [Attribute] -> ShowS $cshowList :: [Attribute] -> ShowS show :: Attribute -> String $cshow :: Attribute -> String showsPrec :: Int -> Attribute -> ShowS $cshowsPrec :: Int -> Attribute -> ShowS Show, Attribute -> Attribute -> Bool (Attribute -> Attribute -> Bool) -> (Attribute -> Attribute -> Bool) -> Eq Attribute forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: Attribute -> Attribute -> Bool $c/= :: Attribute -> Attribute -> Bool == :: Attribute -> Attribute -> Bool $c== :: Attribute -> Attribute -> Bool Eq)