module Stratosphere.Connect.Rule.ActionsProperty (
        module Exports, ActionsProperty(..), mkActionsProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.Connect.Rule.CreateCaseActionProperty as Exports
import {-# SOURCE #-} Stratosphere.Connect.Rule.EventBridgeActionProperty as Exports
import {-# SOURCE #-} Stratosphere.Connect.Rule.SendNotificationActionProperty as Exports
import {-# SOURCE #-} Stratosphere.Connect.Rule.SubmitAutoEvaluationActionProperty as Exports
import {-# SOURCE #-} Stratosphere.Connect.Rule.TaskActionProperty as Exports
import {-# SOURCE #-} Stratosphere.Connect.Rule.UpdateCaseActionProperty as Exports
import Stratosphere.ResourceProperties
data ActionsProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-rule-actions.html>
    ActionsProperty {ActionsProperty -> ()
haddock_workaround_ :: (),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-rule-actions.html#cfn-connect-rule-actions-assigncontactcategoryactions>
                     ActionsProperty -> Maybe Object
assignContactCategoryActions :: (Prelude.Maybe JSON.Object),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-rule-actions.html#cfn-connect-rule-actions-createcaseactions>
                     ActionsProperty -> Maybe [CreateCaseActionProperty]
createCaseActions :: (Prelude.Maybe [CreateCaseActionProperty]),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-rule-actions.html#cfn-connect-rule-actions-endassociatedtasksactions>
                     ActionsProperty -> Maybe Object
endAssociatedTasksActions :: (Prelude.Maybe JSON.Object),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-rule-actions.html#cfn-connect-rule-actions-eventbridgeactions>
                     ActionsProperty -> Maybe [EventBridgeActionProperty]
eventBridgeActions :: (Prelude.Maybe [EventBridgeActionProperty]),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-rule-actions.html#cfn-connect-rule-actions-sendnotificationactions>
                     ActionsProperty -> Maybe [SendNotificationActionProperty]
sendNotificationActions :: (Prelude.Maybe [SendNotificationActionProperty]),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-rule-actions.html#cfn-connect-rule-actions-submitautoevaluationactions>
                     ActionsProperty -> Maybe [SubmitAutoEvaluationActionProperty]
submitAutoEvaluationActions :: (Prelude.Maybe [SubmitAutoEvaluationActionProperty]),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-rule-actions.html#cfn-connect-rule-actions-taskactions>
                     ActionsProperty -> Maybe [TaskActionProperty]
taskActions :: (Prelude.Maybe [TaskActionProperty]),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-connect-rule-actions.html#cfn-connect-rule-actions-updatecaseactions>
                     ActionsProperty -> Maybe [UpdateCaseActionProperty]
updateCaseActions :: (Prelude.Maybe [UpdateCaseActionProperty])}
  deriving stock (ActionsProperty -> ActionsProperty -> Bool
(ActionsProperty -> ActionsProperty -> Bool)
-> (ActionsProperty -> ActionsProperty -> Bool)
-> Eq ActionsProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ActionsProperty -> ActionsProperty -> Bool
== :: ActionsProperty -> ActionsProperty -> Bool
$c/= :: ActionsProperty -> ActionsProperty -> Bool
/= :: ActionsProperty -> ActionsProperty -> Bool
Prelude.Eq, Int -> ActionsProperty -> ShowS
[ActionsProperty] -> ShowS
ActionsProperty -> String
(Int -> ActionsProperty -> ShowS)
-> (ActionsProperty -> String)
-> ([ActionsProperty] -> ShowS)
-> Show ActionsProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ActionsProperty -> ShowS
showsPrec :: Int -> ActionsProperty -> ShowS
$cshow :: ActionsProperty -> String
show :: ActionsProperty -> String
$cshowList :: [ActionsProperty] -> ShowS
showList :: [ActionsProperty] -> ShowS
Prelude.Show)
mkActionsProperty :: ActionsProperty
mkActionsProperty :: ActionsProperty
mkActionsProperty
  = ActionsProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (),
       assignContactCategoryActions :: Maybe Object
assignContactCategoryActions = Maybe Object
forall a. Maybe a
Prelude.Nothing,
       createCaseActions :: Maybe [CreateCaseActionProperty]
createCaseActions = Maybe [CreateCaseActionProperty]
forall a. Maybe a
Prelude.Nothing,
       endAssociatedTasksActions :: Maybe Object
endAssociatedTasksActions = Maybe Object
forall a. Maybe a
Prelude.Nothing,
       eventBridgeActions :: Maybe [EventBridgeActionProperty]
eventBridgeActions = Maybe [EventBridgeActionProperty]
forall a. Maybe a
Prelude.Nothing,
       sendNotificationActions :: Maybe [SendNotificationActionProperty]
sendNotificationActions = Maybe [SendNotificationActionProperty]
forall a. Maybe a
Prelude.Nothing,
       submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
submitAutoEvaluationActions = Maybe [SubmitAutoEvaluationActionProperty]
forall a. Maybe a
Prelude.Nothing,
       taskActions :: Maybe [TaskActionProperty]
taskActions = Maybe [TaskActionProperty]
forall a. Maybe a
Prelude.Nothing, updateCaseActions :: Maybe [UpdateCaseActionProperty]
updateCaseActions = Maybe [UpdateCaseActionProperty]
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties ActionsProperty where
  toResourceProperties :: ActionsProperty -> ResourceProperties
toResourceProperties ActionsProperty {Maybe [EventBridgeActionProperty]
Maybe [CreateCaseActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [TaskActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ActionsProperty -> ()
assignContactCategoryActions :: ActionsProperty -> Maybe Object
createCaseActions :: ActionsProperty -> Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: ActionsProperty -> Maybe Object
eventBridgeActions :: ActionsProperty -> Maybe [EventBridgeActionProperty]
sendNotificationActions :: ActionsProperty -> Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: ActionsProperty -> Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: ActionsProperty -> Maybe [TaskActionProperty]
updateCaseActions :: ActionsProperty -> Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::Connect::Rule.Actions",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
                        ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                           [Key -> Object -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AssignContactCategoryActions"
                              (Object -> (Key, Value)) -> Maybe Object -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Object
assignContactCategoryActions,
                            Key -> [CreateCaseActionProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CreateCaseActions" ([CreateCaseActionProperty] -> (Key, Value))
-> Maybe [CreateCaseActionProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [CreateCaseActionProperty]
createCaseActions,
                            Key -> Object -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EndAssociatedTasksActions"
                              (Object -> (Key, Value)) -> Maybe Object -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Object
endAssociatedTasksActions,
                            Key -> [EventBridgeActionProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EventBridgeActions" ([EventBridgeActionProperty] -> (Key, Value))
-> Maybe [EventBridgeActionProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [EventBridgeActionProperty]
eventBridgeActions,
                            Key -> [SendNotificationActionProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SendNotificationActions"
                              ([SendNotificationActionProperty] -> (Key, Value))
-> Maybe [SendNotificationActionProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [SendNotificationActionProperty]
sendNotificationActions,
                            Key -> [SubmitAutoEvaluationActionProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SubmitAutoEvaluationActions"
                              ([SubmitAutoEvaluationActionProperty] -> (Key, Value))
-> Maybe [SubmitAutoEvaluationActionProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [SubmitAutoEvaluationActionProperty]
submitAutoEvaluationActions,
                            Key -> [TaskActionProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"TaskActions" ([TaskActionProperty] -> (Key, Value))
-> Maybe [TaskActionProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [TaskActionProperty]
taskActions,
                            Key -> [UpdateCaseActionProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"UpdateCaseActions" ([UpdateCaseActionProperty] -> (Key, Value))
-> Maybe [UpdateCaseActionProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [UpdateCaseActionProperty]
updateCaseActions])}
instance JSON.ToJSON ActionsProperty where
  toJSON :: ActionsProperty -> Value
toJSON ActionsProperty {Maybe [EventBridgeActionProperty]
Maybe [CreateCaseActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [TaskActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ActionsProperty -> ()
assignContactCategoryActions :: ActionsProperty -> Maybe Object
createCaseActions :: ActionsProperty -> Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: ActionsProperty -> Maybe Object
eventBridgeActions :: ActionsProperty -> Maybe [EventBridgeActionProperty]
sendNotificationActions :: ActionsProperty -> Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: ActionsProperty -> Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: ActionsProperty -> Maybe [TaskActionProperty]
updateCaseActions :: ActionsProperty -> Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
    = [(Key, Value)] -> Value
JSON.object
        ([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
              [Key -> Object -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AssignContactCategoryActions"
                 (Object -> (Key, Value)) -> Maybe Object -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Object
assignContactCategoryActions,
               Key -> [CreateCaseActionProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CreateCaseActions" ([CreateCaseActionProperty] -> (Key, Value))
-> Maybe [CreateCaseActionProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [CreateCaseActionProperty]
createCaseActions,
               Key -> Object -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EndAssociatedTasksActions"
                 (Object -> (Key, Value)) -> Maybe Object -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Object
endAssociatedTasksActions,
               Key -> [EventBridgeActionProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EventBridgeActions" ([EventBridgeActionProperty] -> (Key, Value))
-> Maybe [EventBridgeActionProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [EventBridgeActionProperty]
eventBridgeActions,
               Key -> [SendNotificationActionProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SendNotificationActions"
                 ([SendNotificationActionProperty] -> (Key, Value))
-> Maybe [SendNotificationActionProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [SendNotificationActionProperty]
sendNotificationActions,
               Key -> [SubmitAutoEvaluationActionProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SubmitAutoEvaluationActions"
                 ([SubmitAutoEvaluationActionProperty] -> (Key, Value))
-> Maybe [SubmitAutoEvaluationActionProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [SubmitAutoEvaluationActionProperty]
submitAutoEvaluationActions,
               Key -> [TaskActionProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"TaskActions" ([TaskActionProperty] -> (Key, Value))
-> Maybe [TaskActionProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [TaskActionProperty]
taskActions,
               Key -> [UpdateCaseActionProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"UpdateCaseActions" ([UpdateCaseActionProperty] -> (Key, Value))
-> Maybe [UpdateCaseActionProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [UpdateCaseActionProperty]
updateCaseActions]))
instance Property "AssignContactCategoryActions" ActionsProperty where
  type PropertyType "AssignContactCategoryActions" ActionsProperty = JSON.Object
  set :: PropertyType "AssignContactCategoryActions" ActionsProperty
-> ActionsProperty -> ActionsProperty
set PropertyType "AssignContactCategoryActions" ActionsProperty
newValue ActionsProperty {Maybe [EventBridgeActionProperty]
Maybe [CreateCaseActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [TaskActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ActionsProperty -> ()
assignContactCategoryActions :: ActionsProperty -> Maybe Object
createCaseActions :: ActionsProperty -> Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: ActionsProperty -> Maybe Object
eventBridgeActions :: ActionsProperty -> Maybe [EventBridgeActionProperty]
sendNotificationActions :: ActionsProperty -> Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: ActionsProperty -> Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: ActionsProperty -> Maybe [TaskActionProperty]
updateCaseActions :: ActionsProperty -> Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
    = ActionsProperty
        {assignContactCategoryActions :: Maybe Object
assignContactCategoryActions = Object -> Maybe Object
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure Object
PropertyType "AssignContactCategoryActions" ActionsProperty
newValue, Maybe [EventBridgeActionProperty]
Maybe [CreateCaseActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [TaskActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ()
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
instance Property "CreateCaseActions" ActionsProperty where
  type PropertyType "CreateCaseActions" ActionsProperty = [CreateCaseActionProperty]
  set :: PropertyType "CreateCaseActions" ActionsProperty
-> ActionsProperty -> ActionsProperty
set PropertyType "CreateCaseActions" ActionsProperty
newValue ActionsProperty {Maybe [EventBridgeActionProperty]
Maybe [CreateCaseActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [TaskActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ActionsProperty -> ()
assignContactCategoryActions :: ActionsProperty -> Maybe Object
createCaseActions :: ActionsProperty -> Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: ActionsProperty -> Maybe Object
eventBridgeActions :: ActionsProperty -> Maybe [EventBridgeActionProperty]
sendNotificationActions :: ActionsProperty -> Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: ActionsProperty -> Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: ActionsProperty -> Maybe [TaskActionProperty]
updateCaseActions :: ActionsProperty -> Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
    = ActionsProperty {createCaseActions :: Maybe [CreateCaseActionProperty]
createCaseActions = [CreateCaseActionProperty] -> Maybe [CreateCaseActionProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [CreateCaseActionProperty]
PropertyType "CreateCaseActions" ActionsProperty
newValue, Maybe [EventBridgeActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [TaskActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
instance Property "EndAssociatedTasksActions" ActionsProperty where
  type PropertyType "EndAssociatedTasksActions" ActionsProperty = JSON.Object
  set :: PropertyType "EndAssociatedTasksActions" ActionsProperty
-> ActionsProperty -> ActionsProperty
set PropertyType "EndAssociatedTasksActions" ActionsProperty
newValue ActionsProperty {Maybe [EventBridgeActionProperty]
Maybe [CreateCaseActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [TaskActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ActionsProperty -> ()
assignContactCategoryActions :: ActionsProperty -> Maybe Object
createCaseActions :: ActionsProperty -> Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: ActionsProperty -> Maybe Object
eventBridgeActions :: ActionsProperty -> Maybe [EventBridgeActionProperty]
sendNotificationActions :: ActionsProperty -> Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: ActionsProperty -> Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: ActionsProperty -> Maybe [TaskActionProperty]
updateCaseActions :: ActionsProperty -> Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
    = ActionsProperty
        {endAssociatedTasksActions :: Maybe Object
endAssociatedTasksActions = Object -> Maybe Object
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure Object
PropertyType "EndAssociatedTasksActions" ActionsProperty
newValue, Maybe [EventBridgeActionProperty]
Maybe [CreateCaseActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [TaskActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
instance Property "EventBridgeActions" ActionsProperty where
  type PropertyType "EventBridgeActions" ActionsProperty = [EventBridgeActionProperty]
  set :: PropertyType "EventBridgeActions" ActionsProperty
-> ActionsProperty -> ActionsProperty
set PropertyType "EventBridgeActions" ActionsProperty
newValue ActionsProperty {Maybe [EventBridgeActionProperty]
Maybe [CreateCaseActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [TaskActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ActionsProperty -> ()
assignContactCategoryActions :: ActionsProperty -> Maybe Object
createCaseActions :: ActionsProperty -> Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: ActionsProperty -> Maybe Object
eventBridgeActions :: ActionsProperty -> Maybe [EventBridgeActionProperty]
sendNotificationActions :: ActionsProperty -> Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: ActionsProperty -> Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: ActionsProperty -> Maybe [TaskActionProperty]
updateCaseActions :: ActionsProperty -> Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
    = ActionsProperty {eventBridgeActions :: Maybe [EventBridgeActionProperty]
eventBridgeActions = [EventBridgeActionProperty] -> Maybe [EventBridgeActionProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [EventBridgeActionProperty]
PropertyType "EventBridgeActions" ActionsProperty
newValue, Maybe [CreateCaseActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [TaskActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
instance Property "SendNotificationActions" ActionsProperty where
  type PropertyType "SendNotificationActions" ActionsProperty = [SendNotificationActionProperty]
  set :: PropertyType "SendNotificationActions" ActionsProperty
-> ActionsProperty -> ActionsProperty
set PropertyType "SendNotificationActions" ActionsProperty
newValue ActionsProperty {Maybe [EventBridgeActionProperty]
Maybe [CreateCaseActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [TaskActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ActionsProperty -> ()
assignContactCategoryActions :: ActionsProperty -> Maybe Object
createCaseActions :: ActionsProperty -> Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: ActionsProperty -> Maybe Object
eventBridgeActions :: ActionsProperty -> Maybe [EventBridgeActionProperty]
sendNotificationActions :: ActionsProperty -> Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: ActionsProperty -> Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: ActionsProperty -> Maybe [TaskActionProperty]
updateCaseActions :: ActionsProperty -> Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
    = ActionsProperty
        {sendNotificationActions :: Maybe [SendNotificationActionProperty]
sendNotificationActions = [SendNotificationActionProperty]
-> Maybe [SendNotificationActionProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [SendNotificationActionProperty]
PropertyType "SendNotificationActions" ActionsProperty
newValue, Maybe [EventBridgeActionProperty]
Maybe [CreateCaseActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [TaskActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
instance Property "SubmitAutoEvaluationActions" ActionsProperty where
  type PropertyType "SubmitAutoEvaluationActions" ActionsProperty = [SubmitAutoEvaluationActionProperty]
  set :: PropertyType "SubmitAutoEvaluationActions" ActionsProperty
-> ActionsProperty -> ActionsProperty
set PropertyType "SubmitAutoEvaluationActions" ActionsProperty
newValue ActionsProperty {Maybe [EventBridgeActionProperty]
Maybe [CreateCaseActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [TaskActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ActionsProperty -> ()
assignContactCategoryActions :: ActionsProperty -> Maybe Object
createCaseActions :: ActionsProperty -> Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: ActionsProperty -> Maybe Object
eventBridgeActions :: ActionsProperty -> Maybe [EventBridgeActionProperty]
sendNotificationActions :: ActionsProperty -> Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: ActionsProperty -> Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: ActionsProperty -> Maybe [TaskActionProperty]
updateCaseActions :: ActionsProperty -> Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
    = ActionsProperty
        {submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
submitAutoEvaluationActions = [SubmitAutoEvaluationActionProperty]
-> Maybe [SubmitAutoEvaluationActionProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [SubmitAutoEvaluationActionProperty]
PropertyType "SubmitAutoEvaluationActions" ActionsProperty
newValue, Maybe [EventBridgeActionProperty]
Maybe [CreateCaseActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [TaskActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
instance Property "TaskActions" ActionsProperty where
  type PropertyType "TaskActions" ActionsProperty = [TaskActionProperty]
  set :: PropertyType "TaskActions" ActionsProperty
-> ActionsProperty -> ActionsProperty
set PropertyType "TaskActions" ActionsProperty
newValue ActionsProperty {Maybe [EventBridgeActionProperty]
Maybe [CreateCaseActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [TaskActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ActionsProperty -> ()
assignContactCategoryActions :: ActionsProperty -> Maybe Object
createCaseActions :: ActionsProperty -> Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: ActionsProperty -> Maybe Object
eventBridgeActions :: ActionsProperty -> Maybe [EventBridgeActionProperty]
sendNotificationActions :: ActionsProperty -> Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: ActionsProperty -> Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: ActionsProperty -> Maybe [TaskActionProperty]
updateCaseActions :: ActionsProperty -> Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
    = ActionsProperty {taskActions :: Maybe [TaskActionProperty]
taskActions = [TaskActionProperty] -> Maybe [TaskActionProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [TaskActionProperty]
PropertyType "TaskActions" ActionsProperty
newValue, Maybe [EventBridgeActionProperty]
Maybe [CreateCaseActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
instance Property "UpdateCaseActions" ActionsProperty where
  type PropertyType "UpdateCaseActions" ActionsProperty = [UpdateCaseActionProperty]
  set :: PropertyType "UpdateCaseActions" ActionsProperty
-> ActionsProperty -> ActionsProperty
set PropertyType "UpdateCaseActions" ActionsProperty
newValue ActionsProperty {Maybe [EventBridgeActionProperty]
Maybe [CreateCaseActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [TaskActionProperty]
Maybe [UpdateCaseActionProperty]
Maybe Object
()
haddock_workaround_ :: ActionsProperty -> ()
assignContactCategoryActions :: ActionsProperty -> Maybe Object
createCaseActions :: ActionsProperty -> Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: ActionsProperty -> Maybe Object
eventBridgeActions :: ActionsProperty -> Maybe [EventBridgeActionProperty]
sendNotificationActions :: ActionsProperty -> Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: ActionsProperty -> Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: ActionsProperty -> Maybe [TaskActionProperty]
updateCaseActions :: ActionsProperty -> Maybe [UpdateCaseActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
updateCaseActions :: Maybe [UpdateCaseActionProperty]
..}
    = ActionsProperty {updateCaseActions :: Maybe [UpdateCaseActionProperty]
updateCaseActions = [UpdateCaseActionProperty] -> Maybe [UpdateCaseActionProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [UpdateCaseActionProperty]
PropertyType "UpdateCaseActions" ActionsProperty
newValue, Maybe [EventBridgeActionProperty]
Maybe [CreateCaseActionProperty]
Maybe [SendNotificationActionProperty]
Maybe [SubmitAutoEvaluationActionProperty]
Maybe [TaskActionProperty]
Maybe Object
()
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
haddock_workaround_ :: ()
assignContactCategoryActions :: Maybe Object
createCaseActions :: Maybe [CreateCaseActionProperty]
endAssociatedTasksActions :: Maybe Object
eventBridgeActions :: Maybe [EventBridgeActionProperty]
sendNotificationActions :: Maybe [SendNotificationActionProperty]
submitAutoEvaluationActions :: Maybe [SubmitAutoEvaluationActionProperty]
taskActions :: Maybe [TaskActionProperty]
..}