module Stratosphere.Lex.Bot.SlotValueElicitationSettingProperty (
module Exports, SlotValueElicitationSettingProperty(..),
mkSlotValueElicitationSettingProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.Lex.Bot.PromptSpecificationProperty as Exports
import {-# SOURCE #-} Stratosphere.Lex.Bot.SampleUtteranceProperty as Exports
import {-# SOURCE #-} Stratosphere.Lex.Bot.SlotCaptureSettingProperty as Exports
import {-# SOURCE #-} Stratosphere.Lex.Bot.SlotDefaultValueSpecificationProperty as Exports
import {-# SOURCE #-} Stratosphere.Lex.Bot.WaitAndContinueSpecificationProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data SlotValueElicitationSettingProperty
=
SlotValueElicitationSettingProperty {SlotValueElicitationSettingProperty -> ()
haddock_workaround_ :: (),
SlotValueElicitationSettingProperty
-> Maybe SlotDefaultValueSpecificationProperty
defaultValueSpecification :: (Prelude.Maybe SlotDefaultValueSpecificationProperty),
SlotValueElicitationSettingProperty
-> Maybe PromptSpecificationProperty
promptSpecification :: (Prelude.Maybe PromptSpecificationProperty),
SlotValueElicitationSettingProperty
-> Maybe [SampleUtteranceProperty]
sampleUtterances :: (Prelude.Maybe [SampleUtteranceProperty]),
SlotValueElicitationSettingProperty
-> Maybe SlotCaptureSettingProperty
slotCaptureSetting :: (Prelude.Maybe SlotCaptureSettingProperty),
SlotValueElicitationSettingProperty -> Value Text
slotConstraint :: (Value Prelude.Text),
SlotValueElicitationSettingProperty
-> Maybe WaitAndContinueSpecificationProperty
waitAndContinueSpecification :: (Prelude.Maybe WaitAndContinueSpecificationProperty)}
deriving stock (SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty -> Bool
(SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty -> Bool)
-> (SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty -> Bool)
-> Eq SlotValueElicitationSettingProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty -> Bool
== :: SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty -> Bool
$c/= :: SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty -> Bool
/= :: SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty -> Bool
Prelude.Eq, Int -> SlotValueElicitationSettingProperty -> ShowS
[SlotValueElicitationSettingProperty] -> ShowS
SlotValueElicitationSettingProperty -> String
(Int -> SlotValueElicitationSettingProperty -> ShowS)
-> (SlotValueElicitationSettingProperty -> String)
-> ([SlotValueElicitationSettingProperty] -> ShowS)
-> Show SlotValueElicitationSettingProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SlotValueElicitationSettingProperty -> ShowS
showsPrec :: Int -> SlotValueElicitationSettingProperty -> ShowS
$cshow :: SlotValueElicitationSettingProperty -> String
show :: SlotValueElicitationSettingProperty -> String
$cshowList :: [SlotValueElicitationSettingProperty] -> ShowS
showList :: [SlotValueElicitationSettingProperty] -> ShowS
Prelude.Show)
mkSlotValueElicitationSettingProperty ::
Value Prelude.Text -> SlotValueElicitationSettingProperty
mkSlotValueElicitationSettingProperty :: Value Text -> SlotValueElicitationSettingProperty
mkSlotValueElicitationSettingProperty Value Text
slotConstraint
= SlotValueElicitationSettingProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), slotConstraint :: Value Text
slotConstraint = Value Text
slotConstraint,
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
defaultValueSpecification = Maybe SlotDefaultValueSpecificationProperty
forall a. Maybe a
Prelude.Nothing,
promptSpecification :: Maybe PromptSpecificationProperty
promptSpecification = Maybe PromptSpecificationProperty
forall a. Maybe a
Prelude.Nothing,
sampleUtterances :: Maybe [SampleUtteranceProperty]
sampleUtterances = Maybe [SampleUtteranceProperty]
forall a. Maybe a
Prelude.Nothing,
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotCaptureSetting = Maybe SlotCaptureSettingProperty
forall a. Maybe a
Prelude.Nothing,
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
waitAndContinueSpecification = Maybe WaitAndContinueSpecificationProperty
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties SlotValueElicitationSettingProperty where
toResourceProperties :: SlotValueElicitationSettingProperty -> ResourceProperties
toResourceProperties SlotValueElicitationSettingProperty {Maybe [SampleUtteranceProperty]
Maybe SlotDefaultValueSpecificationProperty
Maybe SlotCaptureSettingProperty
Maybe PromptSpecificationProperty
Maybe WaitAndContinueSpecificationProperty
()
Value Text
haddock_workaround_ :: SlotValueElicitationSettingProperty -> ()
defaultValueSpecification :: SlotValueElicitationSettingProperty
-> Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: SlotValueElicitationSettingProperty
-> Maybe PromptSpecificationProperty
sampleUtterances :: SlotValueElicitationSettingProperty
-> Maybe [SampleUtteranceProperty]
slotCaptureSetting :: SlotValueElicitationSettingProperty
-> Maybe SlotCaptureSettingProperty
slotConstraint :: SlotValueElicitationSettingProperty -> Value Text
waitAndContinueSpecification :: SlotValueElicitationSettingProperty
-> Maybe WaitAndContinueSpecificationProperty
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: Maybe PromptSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotConstraint :: Value Text
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::Lex::Bot.SlotValueElicitationSetting",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
[Key
"SlotConstraint" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
slotConstraint]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> SlotDefaultValueSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DefaultValueSpecification"
(SlotDefaultValueSpecificationProperty -> (Key, Value))
-> Maybe SlotDefaultValueSpecificationProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SlotDefaultValueSpecificationProperty
defaultValueSpecification,
Key -> PromptSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"PromptSpecification" (PromptSpecificationProperty -> (Key, Value))
-> Maybe PromptSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe PromptSpecificationProperty
promptSpecification,
Key -> [SampleUtteranceProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SampleUtterances" ([SampleUtteranceProperty] -> (Key, Value))
-> Maybe [SampleUtteranceProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [SampleUtteranceProperty]
sampleUtterances,
Key -> SlotCaptureSettingProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SlotCaptureSetting" (SlotCaptureSettingProperty -> (Key, Value))
-> Maybe SlotCaptureSettingProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SlotCaptureSettingProperty
slotCaptureSetting,
Key -> WaitAndContinueSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"WaitAndContinueSpecification"
(WaitAndContinueSpecificationProperty -> (Key, Value))
-> Maybe WaitAndContinueSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe WaitAndContinueSpecificationProperty
waitAndContinueSpecification]))}
instance JSON.ToJSON SlotValueElicitationSettingProperty where
toJSON :: SlotValueElicitationSettingProperty -> Value
toJSON SlotValueElicitationSettingProperty {Maybe [SampleUtteranceProperty]
Maybe SlotDefaultValueSpecificationProperty
Maybe SlotCaptureSettingProperty
Maybe PromptSpecificationProperty
Maybe WaitAndContinueSpecificationProperty
()
Value Text
haddock_workaround_ :: SlotValueElicitationSettingProperty -> ()
defaultValueSpecification :: SlotValueElicitationSettingProperty
-> Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: SlotValueElicitationSettingProperty
-> Maybe PromptSpecificationProperty
sampleUtterances :: SlotValueElicitationSettingProperty
-> Maybe [SampleUtteranceProperty]
slotCaptureSetting :: SlotValueElicitationSettingProperty
-> Maybe SlotCaptureSettingProperty
slotConstraint :: SlotValueElicitationSettingProperty -> Value Text
waitAndContinueSpecification :: SlotValueElicitationSettingProperty
-> Maybe WaitAndContinueSpecificationProperty
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: Maybe PromptSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotConstraint :: Value Text
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
..}
= [(Key, Value)] -> Value
JSON.object
([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
[Key
"SlotConstraint" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
slotConstraint]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> SlotDefaultValueSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DefaultValueSpecification"
(SlotDefaultValueSpecificationProperty -> (Key, Value))
-> Maybe SlotDefaultValueSpecificationProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SlotDefaultValueSpecificationProperty
defaultValueSpecification,
Key -> PromptSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"PromptSpecification" (PromptSpecificationProperty -> (Key, Value))
-> Maybe PromptSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe PromptSpecificationProperty
promptSpecification,
Key -> [SampleUtteranceProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SampleUtterances" ([SampleUtteranceProperty] -> (Key, Value))
-> Maybe [SampleUtteranceProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [SampleUtteranceProperty]
sampleUtterances,
Key -> SlotCaptureSettingProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SlotCaptureSetting" (SlotCaptureSettingProperty -> (Key, Value))
-> Maybe SlotCaptureSettingProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SlotCaptureSettingProperty
slotCaptureSetting,
Key -> WaitAndContinueSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"WaitAndContinueSpecification"
(WaitAndContinueSpecificationProperty -> (Key, Value))
-> Maybe WaitAndContinueSpecificationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe WaitAndContinueSpecificationProperty
waitAndContinueSpecification])))
instance Property "DefaultValueSpecification" SlotValueElicitationSettingProperty where
type PropertyType "DefaultValueSpecification" SlotValueElicitationSettingProperty = SlotDefaultValueSpecificationProperty
set :: PropertyType
"DefaultValueSpecification" SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty
set PropertyType
"DefaultValueSpecification" SlotValueElicitationSettingProperty
newValue SlotValueElicitationSettingProperty {Maybe [SampleUtteranceProperty]
Maybe SlotDefaultValueSpecificationProperty
Maybe SlotCaptureSettingProperty
Maybe PromptSpecificationProperty
Maybe WaitAndContinueSpecificationProperty
()
Value Text
haddock_workaround_ :: SlotValueElicitationSettingProperty -> ()
defaultValueSpecification :: SlotValueElicitationSettingProperty
-> Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: SlotValueElicitationSettingProperty
-> Maybe PromptSpecificationProperty
sampleUtterances :: SlotValueElicitationSettingProperty
-> Maybe [SampleUtteranceProperty]
slotCaptureSetting :: SlotValueElicitationSettingProperty
-> Maybe SlotCaptureSettingProperty
slotConstraint :: SlotValueElicitationSettingProperty -> Value Text
waitAndContinueSpecification :: SlotValueElicitationSettingProperty
-> Maybe WaitAndContinueSpecificationProperty
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: Maybe PromptSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotConstraint :: Value Text
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
..}
= SlotValueElicitationSettingProperty
{defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
defaultValueSpecification = SlotDefaultValueSpecificationProperty
-> Maybe SlotDefaultValueSpecificationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"DefaultValueSpecification" SlotValueElicitationSettingProperty
SlotDefaultValueSpecificationProperty
newValue, Maybe [SampleUtteranceProperty]
Maybe SlotCaptureSettingProperty
Maybe PromptSpecificationProperty
Maybe WaitAndContinueSpecificationProperty
()
Value Text
haddock_workaround_ :: ()
promptSpecification :: Maybe PromptSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotConstraint :: Value Text
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
haddock_workaround_ :: ()
promptSpecification :: Maybe PromptSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotConstraint :: Value Text
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
..}
instance Property "PromptSpecification" SlotValueElicitationSettingProperty where
type PropertyType "PromptSpecification" SlotValueElicitationSettingProperty = PromptSpecificationProperty
set :: PropertyType
"PromptSpecification" SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty
set PropertyType
"PromptSpecification" SlotValueElicitationSettingProperty
newValue SlotValueElicitationSettingProperty {Maybe [SampleUtteranceProperty]
Maybe SlotDefaultValueSpecificationProperty
Maybe SlotCaptureSettingProperty
Maybe PromptSpecificationProperty
Maybe WaitAndContinueSpecificationProperty
()
Value Text
haddock_workaround_ :: SlotValueElicitationSettingProperty -> ()
defaultValueSpecification :: SlotValueElicitationSettingProperty
-> Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: SlotValueElicitationSettingProperty
-> Maybe PromptSpecificationProperty
sampleUtterances :: SlotValueElicitationSettingProperty
-> Maybe [SampleUtteranceProperty]
slotCaptureSetting :: SlotValueElicitationSettingProperty
-> Maybe SlotCaptureSettingProperty
slotConstraint :: SlotValueElicitationSettingProperty -> Value Text
waitAndContinueSpecification :: SlotValueElicitationSettingProperty
-> Maybe WaitAndContinueSpecificationProperty
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: Maybe PromptSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotConstraint :: Value Text
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
..}
= SlotValueElicitationSettingProperty
{promptSpecification :: Maybe PromptSpecificationProperty
promptSpecification = PromptSpecificationProperty -> Maybe PromptSpecificationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"PromptSpecification" SlotValueElicitationSettingProperty
PromptSpecificationProperty
newValue, Maybe [SampleUtteranceProperty]
Maybe SlotDefaultValueSpecificationProperty
Maybe SlotCaptureSettingProperty
Maybe WaitAndContinueSpecificationProperty
()
Value Text
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotConstraint :: Value Text
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotConstraint :: Value Text
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
..}
instance Property "SampleUtterances" SlotValueElicitationSettingProperty where
type PropertyType "SampleUtterances" SlotValueElicitationSettingProperty = [SampleUtteranceProperty]
set :: PropertyType "SampleUtterances" SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty
set PropertyType "SampleUtterances" SlotValueElicitationSettingProperty
newValue SlotValueElicitationSettingProperty {Maybe [SampleUtteranceProperty]
Maybe SlotDefaultValueSpecificationProperty
Maybe SlotCaptureSettingProperty
Maybe PromptSpecificationProperty
Maybe WaitAndContinueSpecificationProperty
()
Value Text
haddock_workaround_ :: SlotValueElicitationSettingProperty -> ()
defaultValueSpecification :: SlotValueElicitationSettingProperty
-> Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: SlotValueElicitationSettingProperty
-> Maybe PromptSpecificationProperty
sampleUtterances :: SlotValueElicitationSettingProperty
-> Maybe [SampleUtteranceProperty]
slotCaptureSetting :: SlotValueElicitationSettingProperty
-> Maybe SlotCaptureSettingProperty
slotConstraint :: SlotValueElicitationSettingProperty -> Value Text
waitAndContinueSpecification :: SlotValueElicitationSettingProperty
-> Maybe WaitAndContinueSpecificationProperty
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: Maybe PromptSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotConstraint :: Value Text
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
..}
= SlotValueElicitationSettingProperty
{sampleUtterances :: Maybe [SampleUtteranceProperty]
sampleUtterances = [SampleUtteranceProperty] -> Maybe [SampleUtteranceProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [SampleUtteranceProperty]
PropertyType "SampleUtterances" SlotValueElicitationSettingProperty
newValue, Maybe SlotDefaultValueSpecificationProperty
Maybe SlotCaptureSettingProperty
Maybe PromptSpecificationProperty
Maybe WaitAndContinueSpecificationProperty
()
Value Text
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: Maybe PromptSpecificationProperty
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotConstraint :: Value Text
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: Maybe PromptSpecificationProperty
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotConstraint :: Value Text
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
..}
instance Property "SlotCaptureSetting" SlotValueElicitationSettingProperty where
type PropertyType "SlotCaptureSetting" SlotValueElicitationSettingProperty = SlotCaptureSettingProperty
set :: PropertyType
"SlotCaptureSetting" SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty
set PropertyType
"SlotCaptureSetting" SlotValueElicitationSettingProperty
newValue SlotValueElicitationSettingProperty {Maybe [SampleUtteranceProperty]
Maybe SlotDefaultValueSpecificationProperty
Maybe SlotCaptureSettingProperty
Maybe PromptSpecificationProperty
Maybe WaitAndContinueSpecificationProperty
()
Value Text
haddock_workaround_ :: SlotValueElicitationSettingProperty -> ()
defaultValueSpecification :: SlotValueElicitationSettingProperty
-> Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: SlotValueElicitationSettingProperty
-> Maybe PromptSpecificationProperty
sampleUtterances :: SlotValueElicitationSettingProperty
-> Maybe [SampleUtteranceProperty]
slotCaptureSetting :: SlotValueElicitationSettingProperty
-> Maybe SlotCaptureSettingProperty
slotConstraint :: SlotValueElicitationSettingProperty -> Value Text
waitAndContinueSpecification :: SlotValueElicitationSettingProperty
-> Maybe WaitAndContinueSpecificationProperty
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: Maybe PromptSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotConstraint :: Value Text
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
..}
= SlotValueElicitationSettingProperty
{slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotCaptureSetting = SlotCaptureSettingProperty -> Maybe SlotCaptureSettingProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"SlotCaptureSetting" SlotValueElicitationSettingProperty
SlotCaptureSettingProperty
newValue, Maybe [SampleUtteranceProperty]
Maybe SlotDefaultValueSpecificationProperty
Maybe PromptSpecificationProperty
Maybe WaitAndContinueSpecificationProperty
()
Value Text
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: Maybe PromptSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotConstraint :: Value Text
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: Maybe PromptSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotConstraint :: Value Text
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
..}
instance Property "SlotConstraint" SlotValueElicitationSettingProperty where
type PropertyType "SlotConstraint" SlotValueElicitationSettingProperty = Value Prelude.Text
set :: PropertyType "SlotConstraint" SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty
set PropertyType "SlotConstraint" SlotValueElicitationSettingProperty
newValue SlotValueElicitationSettingProperty {Maybe [SampleUtteranceProperty]
Maybe SlotDefaultValueSpecificationProperty
Maybe SlotCaptureSettingProperty
Maybe PromptSpecificationProperty
Maybe WaitAndContinueSpecificationProperty
()
Value Text
haddock_workaround_ :: SlotValueElicitationSettingProperty -> ()
defaultValueSpecification :: SlotValueElicitationSettingProperty
-> Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: SlotValueElicitationSettingProperty
-> Maybe PromptSpecificationProperty
sampleUtterances :: SlotValueElicitationSettingProperty
-> Maybe [SampleUtteranceProperty]
slotCaptureSetting :: SlotValueElicitationSettingProperty
-> Maybe SlotCaptureSettingProperty
slotConstraint :: SlotValueElicitationSettingProperty -> Value Text
waitAndContinueSpecification :: SlotValueElicitationSettingProperty
-> Maybe WaitAndContinueSpecificationProperty
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: Maybe PromptSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotConstraint :: Value Text
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
..}
= SlotValueElicitationSettingProperty
{slotConstraint :: Value Text
slotConstraint = PropertyType "SlotConstraint" SlotValueElicitationSettingProperty
Value Text
newValue, Maybe [SampleUtteranceProperty]
Maybe SlotDefaultValueSpecificationProperty
Maybe SlotCaptureSettingProperty
Maybe PromptSpecificationProperty
Maybe WaitAndContinueSpecificationProperty
()
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: Maybe PromptSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: Maybe PromptSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
..}
instance Property "WaitAndContinueSpecification" SlotValueElicitationSettingProperty where
type PropertyType "WaitAndContinueSpecification" SlotValueElicitationSettingProperty = WaitAndContinueSpecificationProperty
set :: PropertyType
"WaitAndContinueSpecification" SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty
-> SlotValueElicitationSettingProperty
set PropertyType
"WaitAndContinueSpecification" SlotValueElicitationSettingProperty
newValue SlotValueElicitationSettingProperty {Maybe [SampleUtteranceProperty]
Maybe SlotDefaultValueSpecificationProperty
Maybe SlotCaptureSettingProperty
Maybe PromptSpecificationProperty
Maybe WaitAndContinueSpecificationProperty
()
Value Text
haddock_workaround_ :: SlotValueElicitationSettingProperty -> ()
defaultValueSpecification :: SlotValueElicitationSettingProperty
-> Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: SlotValueElicitationSettingProperty
-> Maybe PromptSpecificationProperty
sampleUtterances :: SlotValueElicitationSettingProperty
-> Maybe [SampleUtteranceProperty]
slotCaptureSetting :: SlotValueElicitationSettingProperty
-> Maybe SlotCaptureSettingProperty
slotConstraint :: SlotValueElicitationSettingProperty -> Value Text
waitAndContinueSpecification :: SlotValueElicitationSettingProperty
-> Maybe WaitAndContinueSpecificationProperty
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: Maybe PromptSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotConstraint :: Value Text
waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
..}
= SlotValueElicitationSettingProperty
{waitAndContinueSpecification :: Maybe WaitAndContinueSpecificationProperty
waitAndContinueSpecification = WaitAndContinueSpecificationProperty
-> Maybe WaitAndContinueSpecificationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"WaitAndContinueSpecification" SlotValueElicitationSettingProperty
WaitAndContinueSpecificationProperty
newValue, Maybe [SampleUtteranceProperty]
Maybe SlotDefaultValueSpecificationProperty
Maybe SlotCaptureSettingProperty
Maybe PromptSpecificationProperty
()
Value Text
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: Maybe PromptSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotConstraint :: Value Text
haddock_workaround_ :: ()
defaultValueSpecification :: Maybe SlotDefaultValueSpecificationProperty
promptSpecification :: Maybe PromptSpecificationProperty
sampleUtterances :: Maybe [SampleUtteranceProperty]
slotCaptureSetting :: Maybe SlotCaptureSettingProperty
slotConstraint :: Value Text
..}