{-# LANGUAGE DeriveAnyClass #-}

module Hercules.Agent.WorkerProtocol.Event.AttributeIFD where

import Data.Binary (Binary)
import Protolude
import Prelude ()

data AttributeIFD = AttributeIFD
  { AttributeIFD -> [ByteString]
path :: [ByteString],
    AttributeIFD -> ByteString
derivationPath :: ByteString,
    AttributeIFD -> ByteString
derivationOutput :: ByteString,
    AttributeIFD -> Bool
done :: Bool
  }
  deriving (forall x. Rep AttributeIFD x -> AttributeIFD
forall x. AttributeIFD -> Rep AttributeIFD x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep AttributeIFD x -> AttributeIFD
$cfrom :: forall x. AttributeIFD -> Rep AttributeIFD x
Generic, Get AttributeIFD
[AttributeIFD] -> Put
AttributeIFD -> Put
forall t. (t -> Put) -> Get t -> ([t] -> Put) -> Binary t
putList :: [AttributeIFD] -> Put
$cputList :: [AttributeIFD] -> Put
get :: Get AttributeIFD
$cget :: Get AttributeIFD
put :: AttributeIFD -> Put
$cput :: AttributeIFD -> Put
Binary, Int -> AttributeIFD -> ShowS
[AttributeIFD] -> ShowS
AttributeIFD -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [AttributeIFD] -> ShowS
$cshowList :: [AttributeIFD] -> ShowS
show :: AttributeIFD -> String
$cshow :: AttributeIFD -> String
showsPrec :: Int -> AttributeIFD -> ShowS
$cshowsPrec :: Int -> AttributeIFD -> ShowS
Show, AttributeIFD -> AttributeIFD -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: AttributeIFD -> AttributeIFD -> Bool
$c/= :: AttributeIFD -> AttributeIFD -> Bool
== :: AttributeIFD -> AttributeIFD -> Bool
$c== :: AttributeIFD -> AttributeIFD -> Bool
Eq)