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