{-# LANGUAGE DeriveAnyClass #-} module Hercules.Agent.WorkerProtocol.Event.AttributeError where import Data.Binary import Protolude import Prelude () data AttributeError = AttributeError { AttributeError -> [ByteString] path :: [ByteString], AttributeError -> Text message :: Text, AttributeError -> Maybe Text errorType :: Maybe Text, AttributeError -> Maybe Text errorDerivation :: Maybe Text } deriving ((forall x. AttributeError -> Rep AttributeError x) -> (forall x. Rep AttributeError x -> AttributeError) -> Generic AttributeError forall x. Rep AttributeError x -> AttributeError forall x. AttributeError -> Rep AttributeError x forall a. (forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a $cto :: forall x. Rep AttributeError x -> AttributeError $cfrom :: forall x. AttributeError -> Rep AttributeError x Generic, Get AttributeError [AttributeError] -> Put AttributeError -> Put (AttributeError -> Put) -> Get AttributeError -> ([AttributeError] -> Put) -> Binary AttributeError forall t. (t -> Put) -> Get t -> ([t] -> Put) -> Binary t putList :: [AttributeError] -> Put $cputList :: [AttributeError] -> Put get :: Get AttributeError $cget :: Get AttributeError put :: AttributeError -> Put $cput :: AttributeError -> Put Binary, Int -> AttributeError -> ShowS [AttributeError] -> ShowS AttributeError -> String (Int -> AttributeError -> ShowS) -> (AttributeError -> String) -> ([AttributeError] -> ShowS) -> Show AttributeError forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [AttributeError] -> ShowS $cshowList :: [AttributeError] -> ShowS show :: AttributeError -> String $cshow :: AttributeError -> String showsPrec :: Int -> AttributeError -> ShowS $cshowsPrec :: Int -> AttributeError -> ShowS Show, AttributeError -> AttributeError -> Bool (AttributeError -> AttributeError -> Bool) -> (AttributeError -> AttributeError -> Bool) -> Eq AttributeError forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: AttributeError -> AttributeError -> Bool $c/= :: AttributeError -> AttributeError -> Bool == :: AttributeError -> AttributeError -> Bool $c== :: AttributeError -> AttributeError -> Bool Eq)