module Stratosphere.Lex.Bot.PostDialogCodeHookInvocationSpecificationProperty (
        module Exports,
        PostDialogCodeHookInvocationSpecificationProperty(..),
        mkPostDialogCodeHookInvocationSpecificationProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.Lex.Bot.ConditionalSpecificationProperty as Exports
import {-# SOURCE #-} Stratosphere.Lex.Bot.DialogStateProperty as Exports
import {-# SOURCE #-} Stratosphere.Lex.Bot.ResponseSpecificationProperty as Exports
import Stratosphere.ResourceProperties
data PostDialogCodeHookInvocationSpecificationProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-lex-bot-postdialogcodehookinvocationspecification.html>
    PostDialogCodeHookInvocationSpecificationProperty {PostDialogCodeHookInvocationSpecificationProperty -> ()
haddock_workaround_ :: (),
                                                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-lex-bot-postdialogcodehookinvocationspecification.html#cfn-lex-bot-postdialogcodehookinvocationspecification-failureconditional>
                                                       PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
failureConditional :: (Prelude.Maybe ConditionalSpecificationProperty),
                                                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-lex-bot-postdialogcodehookinvocationspecification.html#cfn-lex-bot-postdialogcodehookinvocationspecification-failurenextstep>
                                                       PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
failureNextStep :: (Prelude.Maybe DialogStateProperty),
                                                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-lex-bot-postdialogcodehookinvocationspecification.html#cfn-lex-bot-postdialogcodehookinvocationspecification-failureresponse>
                                                       PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
failureResponse :: (Prelude.Maybe ResponseSpecificationProperty),
                                                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-lex-bot-postdialogcodehookinvocationspecification.html#cfn-lex-bot-postdialogcodehookinvocationspecification-successconditional>
                                                       PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
successConditional :: (Prelude.Maybe ConditionalSpecificationProperty),
                                                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-lex-bot-postdialogcodehookinvocationspecification.html#cfn-lex-bot-postdialogcodehookinvocationspecification-successnextstep>
                                                       PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
successNextStep :: (Prelude.Maybe DialogStateProperty),
                                                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-lex-bot-postdialogcodehookinvocationspecification.html#cfn-lex-bot-postdialogcodehookinvocationspecification-successresponse>
                                                       PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
successResponse :: (Prelude.Maybe ResponseSpecificationProperty),
                                                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-lex-bot-postdialogcodehookinvocationspecification.html#cfn-lex-bot-postdialogcodehookinvocationspecification-timeoutconditional>
                                                       PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
timeoutConditional :: (Prelude.Maybe ConditionalSpecificationProperty),
                                                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-lex-bot-postdialogcodehookinvocationspecification.html#cfn-lex-bot-postdialogcodehookinvocationspecification-timeoutnextstep>
                                                       PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
timeoutNextStep :: (Prelude.Maybe DialogStateProperty),
                                                       -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-lex-bot-postdialogcodehookinvocationspecification.html#cfn-lex-bot-postdialogcodehookinvocationspecification-timeoutresponse>
                                                       PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
timeoutResponse :: (Prelude.Maybe ResponseSpecificationProperty)}
  deriving stock (PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty -> Bool
(PostDialogCodeHookInvocationSpecificationProperty
 -> PostDialogCodeHookInvocationSpecificationProperty -> Bool)
-> (PostDialogCodeHookInvocationSpecificationProperty
    -> PostDialogCodeHookInvocationSpecificationProperty -> Bool)
-> Eq PostDialogCodeHookInvocationSpecificationProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty -> Bool
== :: PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty -> Bool
$c/= :: PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty -> Bool
/= :: PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty -> Bool
Prelude.Eq, Int -> PostDialogCodeHookInvocationSpecificationProperty -> ShowS
[PostDialogCodeHookInvocationSpecificationProperty] -> ShowS
PostDialogCodeHookInvocationSpecificationProperty -> String
(Int -> PostDialogCodeHookInvocationSpecificationProperty -> ShowS)
-> (PostDialogCodeHookInvocationSpecificationProperty -> String)
-> ([PostDialogCodeHookInvocationSpecificationProperty] -> ShowS)
-> Show PostDialogCodeHookInvocationSpecificationProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> PostDialogCodeHookInvocationSpecificationProperty -> ShowS
showsPrec :: Int -> PostDialogCodeHookInvocationSpecificationProperty -> ShowS
$cshow :: PostDialogCodeHookInvocationSpecificationProperty -> String
show :: PostDialogCodeHookInvocationSpecificationProperty -> String
$cshowList :: [PostDialogCodeHookInvocationSpecificationProperty] -> ShowS
showList :: [PostDialogCodeHookInvocationSpecificationProperty] -> ShowS
Prelude.Show)
mkPostDialogCodeHookInvocationSpecificationProperty ::
  PostDialogCodeHookInvocationSpecificationProperty
mkPostDialogCodeHookInvocationSpecificationProperty :: PostDialogCodeHookInvocationSpecificationProperty
mkPostDialogCodeHookInvocationSpecificationProperty
  = PostDialogCodeHookInvocationSpecificationProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), failureConditional :: Maybe ConditionalSpecificationProperty
failureConditional = Maybe ConditionalSpecificationProperty
forall a. Maybe a
Prelude.Nothing,
       failureNextStep :: Maybe DialogStateProperty
failureNextStep = Maybe DialogStateProperty
forall a. Maybe a
Prelude.Nothing,
       failureResponse :: Maybe ResponseSpecificationProperty
failureResponse = Maybe ResponseSpecificationProperty
forall a. Maybe a
Prelude.Nothing,
       successConditional :: Maybe ConditionalSpecificationProperty
successConditional = Maybe ConditionalSpecificationProperty
forall a. Maybe a
Prelude.Nothing,
       successNextStep :: Maybe DialogStateProperty
successNextStep = Maybe DialogStateProperty
forall a. Maybe a
Prelude.Nothing,
       successResponse :: Maybe ResponseSpecificationProperty
successResponse = Maybe ResponseSpecificationProperty
forall a. Maybe a
Prelude.Nothing,
       timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutConditional = Maybe ConditionalSpecificationProperty
forall a. Maybe a
Prelude.Nothing,
       timeoutNextStep :: Maybe DialogStateProperty
timeoutNextStep = Maybe DialogStateProperty
forall a. Maybe a
Prelude.Nothing,
       timeoutResponse :: Maybe ResponseSpecificationProperty
timeoutResponse = Maybe ResponseSpecificationProperty
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties PostDialogCodeHookInvocationSpecificationProperty where
  toResourceProperties :: PostDialogCodeHookInvocationSpecificationProperty
-> ResourceProperties
toResourceProperties
    PostDialogCodeHookInvocationSpecificationProperty {Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: PostDialogCodeHookInvocationSpecificationProperty -> ()
failureConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
failureNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
failureResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
successConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
successNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
successResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
timeoutConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
timeoutNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
timeoutResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::Lex::Bot.PostDialogCodeHookInvocationSpecification",
         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 -> ConditionalSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"FailureConditional" (ConditionalSpecificationProperty -> (Key, Value))
-> Maybe ConditionalSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ConditionalSpecificationProperty
failureConditional,
                            Key -> DialogStateProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"FailureNextStep" (DialogStateProperty -> (Key, Value))
-> Maybe DialogStateProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DialogStateProperty
failureNextStep,
                            Key -> ResponseSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"FailureResponse" (ResponseSpecificationProperty -> (Key, Value))
-> Maybe ResponseSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ResponseSpecificationProperty
failureResponse,
                            Key -> ConditionalSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SuccessConditional" (ConditionalSpecificationProperty -> (Key, Value))
-> Maybe ConditionalSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ConditionalSpecificationProperty
successConditional,
                            Key -> DialogStateProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SuccessNextStep" (DialogStateProperty -> (Key, Value))
-> Maybe DialogStateProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DialogStateProperty
successNextStep,
                            Key -> ResponseSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SuccessResponse" (ResponseSpecificationProperty -> (Key, Value))
-> Maybe ResponseSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ResponseSpecificationProperty
successResponse,
                            Key -> ConditionalSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"TimeoutConditional" (ConditionalSpecificationProperty -> (Key, Value))
-> Maybe ConditionalSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ConditionalSpecificationProperty
timeoutConditional,
                            Key -> DialogStateProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"TimeoutNextStep" (DialogStateProperty -> (Key, Value))
-> Maybe DialogStateProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DialogStateProperty
timeoutNextStep,
                            Key -> ResponseSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"TimeoutResponse" (ResponseSpecificationProperty -> (Key, Value))
-> Maybe ResponseSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ResponseSpecificationProperty
timeoutResponse])}
instance JSON.ToJSON PostDialogCodeHookInvocationSpecificationProperty where
  toJSON :: PostDialogCodeHookInvocationSpecificationProperty -> Value
toJSON PostDialogCodeHookInvocationSpecificationProperty {Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: PostDialogCodeHookInvocationSpecificationProperty -> ()
failureConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
failureNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
failureResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
successConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
successNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
successResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
timeoutConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
timeoutNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
timeoutResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
    = [(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 -> ConditionalSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"FailureConditional" (ConditionalSpecificationProperty -> (Key, Value))
-> Maybe ConditionalSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ConditionalSpecificationProperty
failureConditional,
               Key -> DialogStateProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"FailureNextStep" (DialogStateProperty -> (Key, Value))
-> Maybe DialogStateProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DialogStateProperty
failureNextStep,
               Key -> ResponseSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"FailureResponse" (ResponseSpecificationProperty -> (Key, Value))
-> Maybe ResponseSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ResponseSpecificationProperty
failureResponse,
               Key -> ConditionalSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SuccessConditional" (ConditionalSpecificationProperty -> (Key, Value))
-> Maybe ConditionalSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ConditionalSpecificationProperty
successConditional,
               Key -> DialogStateProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SuccessNextStep" (DialogStateProperty -> (Key, Value))
-> Maybe DialogStateProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DialogStateProperty
successNextStep,
               Key -> ResponseSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SuccessResponse" (ResponseSpecificationProperty -> (Key, Value))
-> Maybe ResponseSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ResponseSpecificationProperty
successResponse,
               Key -> ConditionalSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"TimeoutConditional" (ConditionalSpecificationProperty -> (Key, Value))
-> Maybe ConditionalSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ConditionalSpecificationProperty
timeoutConditional,
               Key -> DialogStateProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"TimeoutNextStep" (DialogStateProperty -> (Key, Value))
-> Maybe DialogStateProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DialogStateProperty
timeoutNextStep,
               Key -> ResponseSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"TimeoutResponse" (ResponseSpecificationProperty -> (Key, Value))
-> Maybe ResponseSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ResponseSpecificationProperty
timeoutResponse]))
instance Property "FailureConditional" PostDialogCodeHookInvocationSpecificationProperty where
  type PropertyType "FailureConditional" PostDialogCodeHookInvocationSpecificationProperty = ConditionalSpecificationProperty
  set :: PropertyType
  "FailureConditional"
  PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
set PropertyType
  "FailureConditional"
  PostDialogCodeHookInvocationSpecificationProperty
newValue PostDialogCodeHookInvocationSpecificationProperty {Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: PostDialogCodeHookInvocationSpecificationProperty -> ()
failureConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
failureNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
failureResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
successConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
successNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
successResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
timeoutConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
timeoutNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
timeoutResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
    = PostDialogCodeHookInvocationSpecificationProperty
        {failureConditional :: Maybe ConditionalSpecificationProperty
failureConditional = ConditionalSpecificationProperty
-> Maybe ConditionalSpecificationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "FailureConditional"
  PostDialogCodeHookInvocationSpecificationProperty
ConditionalSpecificationProperty
newValue, Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: ()
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
instance Property "FailureNextStep" PostDialogCodeHookInvocationSpecificationProperty where
  type PropertyType "FailureNextStep" PostDialogCodeHookInvocationSpecificationProperty = DialogStateProperty
  set :: PropertyType
  "FailureNextStep" PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
set PropertyType
  "FailureNextStep" PostDialogCodeHookInvocationSpecificationProperty
newValue PostDialogCodeHookInvocationSpecificationProperty {Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: PostDialogCodeHookInvocationSpecificationProperty -> ()
failureConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
failureNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
failureResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
successConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
successNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
successResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
timeoutConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
timeoutNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
timeoutResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
    = PostDialogCodeHookInvocationSpecificationProperty
        {failureNextStep :: Maybe DialogStateProperty
failureNextStep = DialogStateProperty -> Maybe DialogStateProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "FailureNextStep" PostDialogCodeHookInvocationSpecificationProperty
DialogStateProperty
newValue, Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
instance Property "FailureResponse" PostDialogCodeHookInvocationSpecificationProperty where
  type PropertyType "FailureResponse" PostDialogCodeHookInvocationSpecificationProperty = ResponseSpecificationProperty
  set :: PropertyType
  "FailureResponse" PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
set PropertyType
  "FailureResponse" PostDialogCodeHookInvocationSpecificationProperty
newValue PostDialogCodeHookInvocationSpecificationProperty {Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: PostDialogCodeHookInvocationSpecificationProperty -> ()
failureConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
failureNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
failureResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
successConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
successNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
successResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
timeoutConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
timeoutNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
timeoutResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
    = PostDialogCodeHookInvocationSpecificationProperty
        {failureResponse :: Maybe ResponseSpecificationProperty
failureResponse = ResponseSpecificationProperty
-> Maybe ResponseSpecificationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "FailureResponse" PostDialogCodeHookInvocationSpecificationProperty
ResponseSpecificationProperty
newValue, Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
instance Property "SuccessConditional" PostDialogCodeHookInvocationSpecificationProperty where
  type PropertyType "SuccessConditional" PostDialogCodeHookInvocationSpecificationProperty = ConditionalSpecificationProperty
  set :: PropertyType
  "SuccessConditional"
  PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
set PropertyType
  "SuccessConditional"
  PostDialogCodeHookInvocationSpecificationProperty
newValue PostDialogCodeHookInvocationSpecificationProperty {Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: PostDialogCodeHookInvocationSpecificationProperty -> ()
failureConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
failureNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
failureResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
successConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
successNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
successResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
timeoutConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
timeoutNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
timeoutResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
    = PostDialogCodeHookInvocationSpecificationProperty
        {successConditional :: Maybe ConditionalSpecificationProperty
successConditional = ConditionalSpecificationProperty
-> Maybe ConditionalSpecificationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "SuccessConditional"
  PostDialogCodeHookInvocationSpecificationProperty
ConditionalSpecificationProperty
newValue, Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
instance Property "SuccessNextStep" PostDialogCodeHookInvocationSpecificationProperty where
  type PropertyType "SuccessNextStep" PostDialogCodeHookInvocationSpecificationProperty = DialogStateProperty
  set :: PropertyType
  "SuccessNextStep" PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
set PropertyType
  "SuccessNextStep" PostDialogCodeHookInvocationSpecificationProperty
newValue PostDialogCodeHookInvocationSpecificationProperty {Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: PostDialogCodeHookInvocationSpecificationProperty -> ()
failureConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
failureNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
failureResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
successConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
successNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
successResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
timeoutConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
timeoutNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
timeoutResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
    = PostDialogCodeHookInvocationSpecificationProperty
        {successNextStep :: Maybe DialogStateProperty
successNextStep = DialogStateProperty -> Maybe DialogStateProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "SuccessNextStep" PostDialogCodeHookInvocationSpecificationProperty
DialogStateProperty
newValue, Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
instance Property "SuccessResponse" PostDialogCodeHookInvocationSpecificationProperty where
  type PropertyType "SuccessResponse" PostDialogCodeHookInvocationSpecificationProperty = ResponseSpecificationProperty
  set :: PropertyType
  "SuccessResponse" PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
set PropertyType
  "SuccessResponse" PostDialogCodeHookInvocationSpecificationProperty
newValue PostDialogCodeHookInvocationSpecificationProperty {Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: PostDialogCodeHookInvocationSpecificationProperty -> ()
failureConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
failureNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
failureResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
successConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
successNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
successResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
timeoutConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
timeoutNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
timeoutResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
    = PostDialogCodeHookInvocationSpecificationProperty
        {successResponse :: Maybe ResponseSpecificationProperty
successResponse = ResponseSpecificationProperty
-> Maybe ResponseSpecificationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "SuccessResponse" PostDialogCodeHookInvocationSpecificationProperty
ResponseSpecificationProperty
newValue, Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
instance Property "TimeoutConditional" PostDialogCodeHookInvocationSpecificationProperty where
  type PropertyType "TimeoutConditional" PostDialogCodeHookInvocationSpecificationProperty = ConditionalSpecificationProperty
  set :: PropertyType
  "TimeoutConditional"
  PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
set PropertyType
  "TimeoutConditional"
  PostDialogCodeHookInvocationSpecificationProperty
newValue PostDialogCodeHookInvocationSpecificationProperty {Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: PostDialogCodeHookInvocationSpecificationProperty -> ()
failureConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
failureNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
failureResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
successConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
successNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
successResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
timeoutConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
timeoutNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
timeoutResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
    = PostDialogCodeHookInvocationSpecificationProperty
        {timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutConditional = ConditionalSpecificationProperty
-> Maybe ConditionalSpecificationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "TimeoutConditional"
  PostDialogCodeHookInvocationSpecificationProperty
ConditionalSpecificationProperty
newValue, Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
instance Property "TimeoutNextStep" PostDialogCodeHookInvocationSpecificationProperty where
  type PropertyType "TimeoutNextStep" PostDialogCodeHookInvocationSpecificationProperty = DialogStateProperty
  set :: PropertyType
  "TimeoutNextStep" PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
set PropertyType
  "TimeoutNextStep" PostDialogCodeHookInvocationSpecificationProperty
newValue PostDialogCodeHookInvocationSpecificationProperty {Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: PostDialogCodeHookInvocationSpecificationProperty -> ()
failureConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
failureNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
failureResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
successConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
successNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
successResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
timeoutConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
timeoutNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
timeoutResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
    = PostDialogCodeHookInvocationSpecificationProperty
        {timeoutNextStep :: Maybe DialogStateProperty
timeoutNextStep = DialogStateProperty -> Maybe DialogStateProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "TimeoutNextStep" PostDialogCodeHookInvocationSpecificationProperty
DialogStateProperty
newValue, Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
instance Property "TimeoutResponse" PostDialogCodeHookInvocationSpecificationProperty where
  type PropertyType "TimeoutResponse" PostDialogCodeHookInvocationSpecificationProperty = ResponseSpecificationProperty
  set :: PropertyType
  "TimeoutResponse" PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
-> PostDialogCodeHookInvocationSpecificationProperty
set PropertyType
  "TimeoutResponse" PostDialogCodeHookInvocationSpecificationProperty
newValue PostDialogCodeHookInvocationSpecificationProperty {Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: PostDialogCodeHookInvocationSpecificationProperty -> ()
failureConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
failureNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
failureResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
successConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
successNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
successResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
timeoutConditional :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ConditionalSpecificationProperty
timeoutNextStep :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe DialogStateProperty
timeoutResponse :: PostDialogCodeHookInvocationSpecificationProperty
-> Maybe ResponseSpecificationProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
timeoutResponse :: Maybe ResponseSpecificationProperty
..}
    = PostDialogCodeHookInvocationSpecificationProperty
        {timeoutResponse :: Maybe ResponseSpecificationProperty
timeoutResponse = ResponseSpecificationProperty
-> Maybe ResponseSpecificationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "TimeoutResponse" PostDialogCodeHookInvocationSpecificationProperty
ResponseSpecificationProperty
newValue, Maybe ResponseSpecificationProperty
Maybe DialogStateProperty
Maybe ConditionalSpecificationProperty
()
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
haddock_workaround_ :: ()
failureConditional :: Maybe ConditionalSpecificationProperty
failureNextStep :: Maybe DialogStateProperty
failureResponse :: Maybe ResponseSpecificationProperty
successConditional :: Maybe ConditionalSpecificationProperty
successNextStep :: Maybe DialogStateProperty
successResponse :: Maybe ResponseSpecificationProperty
timeoutConditional :: Maybe ConditionalSpecificationProperty
timeoutNextStep :: Maybe DialogStateProperty
..}