module Stratosphere.Lex.BotAlias (
        module Exports, BotAlias(..), mkBotAlias
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.Lex.BotAlias.BotAliasLocaleSettingsItemProperty as Exports
import {-# SOURCE #-} Stratosphere.Lex.BotAlias.ConversationLogSettingsProperty as Exports
import {-# SOURCE #-} Stratosphere.Lex.BotAlias.SentimentAnalysisSettingsProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Tag
import Stratosphere.Value
data BotAlias
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-lex-botalias.html>
    BotAlias {BotAlias -> ()
haddock_workaround_ :: (),
              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-lex-botalias.html#cfn-lex-botalias-botaliaslocalesettings>
              BotAlias -> Maybe [BotAliasLocaleSettingsItemProperty]
botAliasLocaleSettings :: (Prelude.Maybe [BotAliasLocaleSettingsItemProperty]),
              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-lex-botalias.html#cfn-lex-botalias-botaliasname>
              BotAlias -> Value Text
botAliasName :: (Value Prelude.Text),
              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-lex-botalias.html#cfn-lex-botalias-botaliastags>
              BotAlias -> Maybe [Tag]
botAliasTags :: (Prelude.Maybe [Tag]),
              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-lex-botalias.html#cfn-lex-botalias-botid>
              BotAlias -> Value Text
botId :: (Value Prelude.Text),
              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-lex-botalias.html#cfn-lex-botalias-botversion>
              BotAlias -> Maybe (Value Text)
botVersion :: (Prelude.Maybe (Value Prelude.Text)),
              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-lex-botalias.html#cfn-lex-botalias-conversationlogsettings>
              BotAlias -> Maybe ConversationLogSettingsProperty
conversationLogSettings :: (Prelude.Maybe ConversationLogSettingsProperty),
              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-lex-botalias.html#cfn-lex-botalias-description>
              BotAlias -> Maybe (Value Text)
description :: (Prelude.Maybe (Value Prelude.Text)),
              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-lex-botalias.html#cfn-lex-botalias-sentimentanalysissettings>
              BotAlias -> Maybe SentimentAnalysisSettingsProperty
sentimentAnalysisSettings :: (Prelude.Maybe SentimentAnalysisSettingsProperty)}
  deriving stock (BotAlias -> BotAlias -> Bool
(BotAlias -> BotAlias -> Bool)
-> (BotAlias -> BotAlias -> Bool) -> Eq BotAlias
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: BotAlias -> BotAlias -> Bool
== :: BotAlias -> BotAlias -> Bool
$c/= :: BotAlias -> BotAlias -> Bool
/= :: BotAlias -> BotAlias -> Bool
Prelude.Eq, Int -> BotAlias -> ShowS
[BotAlias] -> ShowS
BotAlias -> String
(Int -> BotAlias -> ShowS)
-> (BotAlias -> String) -> ([BotAlias] -> ShowS) -> Show BotAlias
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> BotAlias -> ShowS
showsPrec :: Int -> BotAlias -> ShowS
$cshow :: BotAlias -> String
show :: BotAlias -> String
$cshowList :: [BotAlias] -> ShowS
showList :: [BotAlias] -> ShowS
Prelude.Show)
mkBotAlias :: Value Prelude.Text -> Value Prelude.Text -> BotAlias
mkBotAlias :: Value Text -> Value Text -> BotAlias
mkBotAlias Value Text
botAliasName Value Text
botId
  = BotAlias
      {haddock_workaround_ :: ()
haddock_workaround_ = (), botAliasName :: Value Text
botAliasName = Value Text
botAliasName,
       botId :: Value Text
botId = Value Text
botId, botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasLocaleSettings = Maybe [BotAliasLocaleSettingsItemProperty]
forall a. Maybe a
Prelude.Nothing,
       botAliasTags :: Maybe [Tag]
botAliasTags = Maybe [Tag]
forall a. Maybe a
Prelude.Nothing, botVersion :: Maybe (Value Text)
botVersion = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       conversationLogSettings :: Maybe ConversationLogSettingsProperty
conversationLogSettings = Maybe ConversationLogSettingsProperty
forall a. Maybe a
Prelude.Nothing,
       description :: Maybe (Value Text)
description = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
sentimentAnalysisSettings = Maybe SentimentAnalysisSettingsProperty
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties BotAlias where
  toResourceProperties :: BotAlias -> ResourceProperties
toResourceProperties BotAlias {Maybe [Tag]
Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: BotAlias -> ()
botAliasLocaleSettings :: BotAlias -> Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: BotAlias -> Value Text
botAliasTags :: BotAlias -> Maybe [Tag]
botId :: BotAlias -> Value Text
botVersion :: BotAlias -> Maybe (Value Text)
conversationLogSettings :: BotAlias -> Maybe ConversationLogSettingsProperty
description :: BotAlias -> Maybe (Value Text)
sentimentAnalysisSettings :: BotAlias -> Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::Lex::BotAlias", 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
"BotAliasName" 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
botAliasName, Key
"BotId" 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
botId]
                           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                              [Key -> [BotAliasLocaleSettingsItemProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BotAliasLocaleSettings"
                                 ([BotAliasLocaleSettingsItemProperty] -> (Key, Value))
-> Maybe [BotAliasLocaleSettingsItemProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [BotAliasLocaleSettingsItemProperty]
botAliasLocaleSettings,
                               Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BotAliasTags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
botAliasTags,
                               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..=) Key
"BotVersion" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
botVersion,
                               Key -> ConversationLogSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ConversationLogSettings"
                                 (ConversationLogSettingsProperty -> (Key, Value))
-> Maybe ConversationLogSettingsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ConversationLogSettingsProperty
conversationLogSettings,
                               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..=) Key
"Description" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
description,
                               Key -> SentimentAnalysisSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SentimentAnalysisSettings"
                                 (SentimentAnalysisSettingsProperty -> (Key, Value))
-> Maybe SentimentAnalysisSettingsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SentimentAnalysisSettingsProperty
sentimentAnalysisSettings]))}
instance JSON.ToJSON BotAlias where
  toJSON :: BotAlias -> Value
toJSON BotAlias {Maybe [Tag]
Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: BotAlias -> ()
botAliasLocaleSettings :: BotAlias -> Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: BotAlias -> Value Text
botAliasTags :: BotAlias -> Maybe [Tag]
botId :: BotAlias -> Value Text
botVersion :: BotAlias -> Maybe (Value Text)
conversationLogSettings :: BotAlias -> Maybe ConversationLogSettingsProperty
description :: BotAlias -> Maybe (Value Text)
sentimentAnalysisSettings :: BotAlias -> Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..}
    = [(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
"BotAliasName" 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
botAliasName, Key
"BotId" 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
botId]
              ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                 [Key -> [BotAliasLocaleSettingsItemProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BotAliasLocaleSettings"
                    ([BotAliasLocaleSettingsItemProperty] -> (Key, Value))
-> Maybe [BotAliasLocaleSettingsItemProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [BotAliasLocaleSettingsItemProperty]
botAliasLocaleSettings,
                  Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BotAliasTags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
botAliasTags,
                  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..=) Key
"BotVersion" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
botVersion,
                  Key -> ConversationLogSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ConversationLogSettings"
                    (ConversationLogSettingsProperty -> (Key, Value))
-> Maybe ConversationLogSettingsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ConversationLogSettingsProperty
conversationLogSettings,
                  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..=) Key
"Description" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
description,
                  Key -> SentimentAnalysisSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SentimentAnalysisSettings"
                    (SentimentAnalysisSettingsProperty -> (Key, Value))
-> Maybe SentimentAnalysisSettingsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SentimentAnalysisSettingsProperty
sentimentAnalysisSettings])))
instance Property "BotAliasLocaleSettings" BotAlias where
  type PropertyType "BotAliasLocaleSettings" BotAlias = [BotAliasLocaleSettingsItemProperty]
  set :: PropertyType "BotAliasLocaleSettings" BotAlias
-> BotAlias -> BotAlias
set PropertyType "BotAliasLocaleSettings" BotAlias
newValue BotAlias {Maybe [Tag]
Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: BotAlias -> ()
botAliasLocaleSettings :: BotAlias -> Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: BotAlias -> Value Text
botAliasTags :: BotAlias -> Maybe [Tag]
botId :: BotAlias -> Value Text
botVersion :: BotAlias -> Maybe (Value Text)
conversationLogSettings :: BotAlias -> Maybe ConversationLogSettingsProperty
description :: BotAlias -> Maybe (Value Text)
sentimentAnalysisSettings :: BotAlias -> Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..}
    = BotAlias {botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasLocaleSettings = [BotAliasLocaleSettingsItemProperty]
-> Maybe [BotAliasLocaleSettingsItemProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [BotAliasLocaleSettingsItemProperty]
PropertyType "BotAliasLocaleSettings" BotAlias
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: ()
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..}
instance Property "BotAliasName" BotAlias where
  type PropertyType "BotAliasName" BotAlias = Value Prelude.Text
  set :: PropertyType "BotAliasName" BotAlias -> BotAlias -> BotAlias
set PropertyType "BotAliasName" BotAlias
newValue BotAlias {Maybe [Tag]
Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: BotAlias -> ()
botAliasLocaleSettings :: BotAlias -> Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: BotAlias -> Value Text
botAliasTags :: BotAlias -> Maybe [Tag]
botId :: BotAlias -> Value Text
botVersion :: BotAlias -> Maybe (Value Text)
conversationLogSettings :: BotAlias -> Maybe ConversationLogSettingsProperty
description :: BotAlias -> Maybe (Value Text)
sentimentAnalysisSettings :: BotAlias -> Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..} = BotAlias {botAliasName :: Value Text
botAliasName = PropertyType "BotAliasName" BotAlias
Value Text
newValue, Maybe [Tag]
Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..}
instance Property "BotAliasTags" BotAlias where
  type PropertyType "BotAliasTags" BotAlias = [Tag]
  set :: PropertyType "BotAliasTags" BotAlias -> BotAlias -> BotAlias
set PropertyType "BotAliasTags" BotAlias
newValue BotAlias {Maybe [Tag]
Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: BotAlias -> ()
botAliasLocaleSettings :: BotAlias -> Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: BotAlias -> Value Text
botAliasTags :: BotAlias -> Maybe [Tag]
botId :: BotAlias -> Value Text
botVersion :: BotAlias -> Maybe (Value Text)
conversationLogSettings :: BotAlias -> Maybe ConversationLogSettingsProperty
description :: BotAlias -> Maybe (Value Text)
sentimentAnalysisSettings :: BotAlias -> Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..}
    = BotAlias {botAliasTags :: Maybe [Tag]
botAliasTags = [Tag] -> Maybe [Tag]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [Tag]
PropertyType "BotAliasTags" BotAlias
newValue, Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..}
instance Property "BotId" BotAlias where
  type PropertyType "BotId" BotAlias = Value Prelude.Text
  set :: PropertyType "BotId" BotAlias -> BotAlias -> BotAlias
set PropertyType "BotId" BotAlias
newValue BotAlias {Maybe [Tag]
Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: BotAlias -> ()
botAliasLocaleSettings :: BotAlias -> Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: BotAlias -> Value Text
botAliasTags :: BotAlias -> Maybe [Tag]
botId :: BotAlias -> Value Text
botVersion :: BotAlias -> Maybe (Value Text)
conversationLogSettings :: BotAlias -> Maybe ConversationLogSettingsProperty
description :: BotAlias -> Maybe (Value Text)
sentimentAnalysisSettings :: BotAlias -> Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..} = BotAlias {botId :: Value Text
botId = PropertyType "BotId" BotAlias
Value Text
newValue, Maybe [Tag]
Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..}
instance Property "BotVersion" BotAlias where
  type PropertyType "BotVersion" BotAlias = Value Prelude.Text
  set :: PropertyType "BotVersion" BotAlias -> BotAlias -> BotAlias
set PropertyType "BotVersion" BotAlias
newValue BotAlias {Maybe [Tag]
Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: BotAlias -> ()
botAliasLocaleSettings :: BotAlias -> Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: BotAlias -> Value Text
botAliasTags :: BotAlias -> Maybe [Tag]
botId :: BotAlias -> Value Text
botVersion :: BotAlias -> Maybe (Value Text)
conversationLogSettings :: BotAlias -> Maybe ConversationLogSettingsProperty
description :: BotAlias -> Maybe (Value Text)
sentimentAnalysisSettings :: BotAlias -> Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..}
    = BotAlias {botVersion :: Maybe (Value Text)
botVersion = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "BotVersion" BotAlias
Value Text
newValue, Maybe [Tag]
Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..}
instance Property "ConversationLogSettings" BotAlias where
  type PropertyType "ConversationLogSettings" BotAlias = ConversationLogSettingsProperty
  set :: PropertyType "ConversationLogSettings" BotAlias
-> BotAlias -> BotAlias
set PropertyType "ConversationLogSettings" BotAlias
newValue BotAlias {Maybe [Tag]
Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: BotAlias -> ()
botAliasLocaleSettings :: BotAlias -> Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: BotAlias -> Value Text
botAliasTags :: BotAlias -> Maybe [Tag]
botId :: BotAlias -> Value Text
botVersion :: BotAlias -> Maybe (Value Text)
conversationLogSettings :: BotAlias -> Maybe ConversationLogSettingsProperty
description :: BotAlias -> Maybe (Value Text)
sentimentAnalysisSettings :: BotAlias -> Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..}
    = BotAlias {conversationLogSettings :: Maybe ConversationLogSettingsProperty
conversationLogSettings = ConversationLogSettingsProperty
-> Maybe ConversationLogSettingsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ConversationLogSettings" BotAlias
ConversationLogSettingsProperty
newValue, Maybe [Tag]
Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
()
Value Text
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..}
instance Property "Description" BotAlias where
  type PropertyType "Description" BotAlias = Value Prelude.Text
  set :: PropertyType "Description" BotAlias -> BotAlias -> BotAlias
set PropertyType "Description" BotAlias
newValue BotAlias {Maybe [Tag]
Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: BotAlias -> ()
botAliasLocaleSettings :: BotAlias -> Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: BotAlias -> Value Text
botAliasTags :: BotAlias -> Maybe [Tag]
botId :: BotAlias -> Value Text
botVersion :: BotAlias -> Maybe (Value Text)
conversationLogSettings :: BotAlias -> Maybe ConversationLogSettingsProperty
description :: BotAlias -> Maybe (Value Text)
sentimentAnalysisSettings :: BotAlias -> Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..}
    = BotAlias {description :: Maybe (Value Text)
description = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Description" BotAlias
Value Text
newValue, Maybe [Tag]
Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..}
instance Property "SentimentAnalysisSettings" BotAlias where
  type PropertyType "SentimentAnalysisSettings" BotAlias = SentimentAnalysisSettingsProperty
  set :: PropertyType "SentimentAnalysisSettings" BotAlias
-> BotAlias -> BotAlias
set PropertyType "SentimentAnalysisSettings" BotAlias
newValue BotAlias {Maybe [Tag]
Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe SentimentAnalysisSettingsProperty
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: BotAlias -> ()
botAliasLocaleSettings :: BotAlias -> Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: BotAlias -> Value Text
botAliasTags :: BotAlias -> Maybe [Tag]
botId :: BotAlias -> Value Text
botVersion :: BotAlias -> Maybe (Value Text)
conversationLogSettings :: BotAlias -> Maybe ConversationLogSettingsProperty
description :: BotAlias -> Maybe (Value Text)
sentimentAnalysisSettings :: BotAlias -> Maybe SentimentAnalysisSettingsProperty
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
..}
    = BotAlias {sentimentAnalysisSettings :: Maybe SentimentAnalysisSettingsProperty
sentimentAnalysisSettings = SentimentAnalysisSettingsProperty
-> Maybe SentimentAnalysisSettingsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "SentimentAnalysisSettings" BotAlias
SentimentAnalysisSettingsProperty
newValue, Maybe [Tag]
Maybe [BotAliasLocaleSettingsItemProperty]
Maybe (Value Text)
Maybe ConversationLogSettingsProperty
()
Value Text
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
haddock_workaround_ :: ()
botAliasLocaleSettings :: Maybe [BotAliasLocaleSettingsItemProperty]
botAliasName :: Value Text
botAliasTags :: Maybe [Tag]
botId :: Value Text
botVersion :: Maybe (Value Text)
conversationLogSettings :: Maybe ConversationLogSettingsProperty
description :: Maybe (Value Text)
..}