{-# LANGUAGE ConstraintKinds #-} {-# LANGUAGE DeriveAnyClass #-} module Hercules.API.Agent.Evaluate.EvaluateEvent.AttributeIFDEvent where import Hercules.API.Prelude data AttributeIFDEvent = AttributeIFDEvent { AttributeIFDEvent -> [Text] expressionPath :: [Text], AttributeIFDEvent -> Text derivationPath :: Text, AttributeIFDEvent -> Text derivationOutput :: Text, AttributeIFDEvent -> Bool done :: Bool, AttributeIFDEvent -> Int index :: Int } deriving (forall x. Rep AttributeIFDEvent x -> AttributeIFDEvent forall x. AttributeIFDEvent -> Rep AttributeIFDEvent x forall a. (forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a $cto :: forall x. Rep AttributeIFDEvent x -> AttributeIFDEvent $cfrom :: forall x. AttributeIFDEvent -> Rep AttributeIFDEvent x Generic, Int -> AttributeIFDEvent -> ShowS [AttributeIFDEvent] -> ShowS AttributeIFDEvent -> String forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [AttributeIFDEvent] -> ShowS $cshowList :: [AttributeIFDEvent] -> ShowS show :: AttributeIFDEvent -> String $cshow :: AttributeIFDEvent -> String showsPrec :: Int -> AttributeIFDEvent -> ShowS $cshowsPrec :: Int -> AttributeIFDEvent -> ShowS Show, AttributeIFDEvent -> AttributeIFDEvent -> Bool forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: AttributeIFDEvent -> AttributeIFDEvent -> Bool $c/= :: AttributeIFDEvent -> AttributeIFDEvent -> Bool == :: AttributeIFDEvent -> AttributeIFDEvent -> Bool $c== :: AttributeIFDEvent -> AttributeIFDEvent -> Bool Eq, AttributeIFDEvent -> () forall a. (a -> ()) -> NFData a rnf :: AttributeIFDEvent -> () $crnf :: AttributeIFDEvent -> () NFData, Value -> Parser [AttributeIFDEvent] Value -> Parser AttributeIFDEvent forall a. (Value -> Parser a) -> (Value -> Parser [a]) -> FromJSON a parseJSONList :: Value -> Parser [AttributeIFDEvent] $cparseJSONList :: Value -> Parser [AttributeIFDEvent] parseJSON :: Value -> Parser AttributeIFDEvent $cparseJSON :: Value -> Parser AttributeIFDEvent FromJSON, [AttributeIFDEvent] -> Encoding [AttributeIFDEvent] -> Value AttributeIFDEvent -> Encoding AttributeIFDEvent -> Value forall a. (a -> Value) -> (a -> Encoding) -> ([a] -> Value) -> ([a] -> Encoding) -> ToJSON a toEncodingList :: [AttributeIFDEvent] -> Encoding $ctoEncodingList :: [AttributeIFDEvent] -> Encoding toJSONList :: [AttributeIFDEvent] -> Value $ctoJSONList :: [AttributeIFDEvent] -> Value toEncoding :: AttributeIFDEvent -> Encoding $ctoEncoding :: AttributeIFDEvent -> Encoding toJSON :: AttributeIFDEvent -> Value $ctoJSON :: AttributeIFDEvent -> Value ToJSON)