{-# 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. AttributeIFD -> Rep AttributeIFD x)
-> (forall x. Rep AttributeIFD x -> AttributeIFD)
-> Generic AttributeIFD
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
$cfrom :: forall x. AttributeIFD -> Rep AttributeIFD x
from :: forall x. AttributeIFD -> Rep AttributeIFD x
$cto :: forall x. Rep AttributeIFD x -> AttributeIFD
to :: forall x. Rep AttributeIFD x -> AttributeIFD
Generic, Get AttributeIFD
[AttributeIFD] -> Put
AttributeIFD -> Put
(AttributeIFD -> Put)
-> Get AttributeIFD
-> ([AttributeIFD] -> Put)
-> Binary AttributeIFD
forall t. (t -> Put) -> Get t -> ([t] -> Put) -> Binary t
$cput :: AttributeIFD -> Put
put :: AttributeIFD -> Put
$cget :: Get AttributeIFD
get :: Get AttributeIFD
$cputList :: [AttributeIFD] -> Put
putList :: [AttributeIFD] -> Put
Binary, Int -> AttributeIFD -> ShowS
[AttributeIFD] -> ShowS
AttributeIFD -> String
(Int -> AttributeIFD -> ShowS)
-> (AttributeIFD -> String)
-> ([AttributeIFD] -> ShowS)
-> Show AttributeIFD
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> AttributeIFD -> ShowS
showsPrec :: Int -> AttributeIFD -> ShowS
$cshow :: AttributeIFD -> String
show :: AttributeIFD -> String
$cshowList :: [AttributeIFD] -> ShowS
showList :: [AttributeIFD] -> ShowS
Show, AttributeIFD -> AttributeIFD -> Bool
(AttributeIFD -> AttributeIFD -> Bool)
-> (AttributeIFD -> AttributeIFD -> Bool) -> Eq AttributeIFD
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: AttributeIFD -> AttributeIFD -> Bool
== :: AttributeIFD -> AttributeIFD -> Bool
$c/= :: AttributeIFD -> AttributeIFD -> Bool
/= :: AttributeIFD -> AttributeIFD -> Bool
Eq)