module Stratosphere.Wisdom.MessageTemplate (
        module Exports, MessageTemplate(..), mkMessageTemplate
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.Wisdom.MessageTemplate.ContentProperty as Exports
import {-# SOURCE #-} Stratosphere.Wisdom.MessageTemplate.GroupingConfigurationProperty as Exports
import {-# SOURCE #-} Stratosphere.Wisdom.MessageTemplate.MessageTemplateAttachmentProperty as Exports
import {-# SOURCE #-} Stratosphere.Wisdom.MessageTemplate.MessageTemplateAttributesProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Tag
import Stratosphere.Value
data MessageTemplate
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-wisdom-messagetemplate.html>
    MessageTemplate {MessageTemplate -> ()
haddock_workaround_ :: (),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-wisdom-messagetemplate.html#cfn-wisdom-messagetemplate-channelsubtype>
                     MessageTemplate -> Value Text
channelSubtype :: (Value Prelude.Text),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-wisdom-messagetemplate.html#cfn-wisdom-messagetemplate-content>
                     MessageTemplate -> ContentProperty
content :: ContentProperty,
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-wisdom-messagetemplate.html#cfn-wisdom-messagetemplate-defaultattributes>
                     MessageTemplate -> Maybe MessageTemplateAttributesProperty
defaultAttributes :: (Prelude.Maybe MessageTemplateAttributesProperty),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-wisdom-messagetemplate.html#cfn-wisdom-messagetemplate-description>
                     MessageTemplate -> Maybe (Value Text)
description :: (Prelude.Maybe (Value Prelude.Text)),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-wisdom-messagetemplate.html#cfn-wisdom-messagetemplate-groupingconfiguration>
                     MessageTemplate -> Maybe GroupingConfigurationProperty
groupingConfiguration :: (Prelude.Maybe GroupingConfigurationProperty),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-wisdom-messagetemplate.html#cfn-wisdom-messagetemplate-knowledgebasearn>
                     MessageTemplate -> Value Text
knowledgeBaseArn :: (Value Prelude.Text),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-wisdom-messagetemplate.html#cfn-wisdom-messagetemplate-language>
                     MessageTemplate -> Maybe (Value Text)
language :: (Prelude.Maybe (Value Prelude.Text)),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-wisdom-messagetemplate.html#cfn-wisdom-messagetemplate-messagetemplateattachments>
                     MessageTemplate -> Maybe [MessageTemplateAttachmentProperty]
messageTemplateAttachments :: (Prelude.Maybe [MessageTemplateAttachmentProperty]),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-wisdom-messagetemplate.html#cfn-wisdom-messagetemplate-name>
                     MessageTemplate -> Value Text
name :: (Value Prelude.Text),
                     -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-wisdom-messagetemplate.html#cfn-wisdom-messagetemplate-tags>
                     MessageTemplate -> Maybe [Tag]
tags :: (Prelude.Maybe [Tag])}
  deriving stock (MessageTemplate -> MessageTemplate -> Bool
(MessageTemplate -> MessageTemplate -> Bool)
-> (MessageTemplate -> MessageTemplate -> Bool)
-> Eq MessageTemplate
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: MessageTemplate -> MessageTemplate -> Bool
== :: MessageTemplate -> MessageTemplate -> Bool
$c/= :: MessageTemplate -> MessageTemplate -> Bool
/= :: MessageTemplate -> MessageTemplate -> Bool
Prelude.Eq, Int -> MessageTemplate -> ShowS
[MessageTemplate] -> ShowS
MessageTemplate -> String
(Int -> MessageTemplate -> ShowS)
-> (MessageTemplate -> String)
-> ([MessageTemplate] -> ShowS)
-> Show MessageTemplate
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> MessageTemplate -> ShowS
showsPrec :: Int -> MessageTemplate -> ShowS
$cshow :: MessageTemplate -> String
show :: MessageTemplate -> String
$cshowList :: [MessageTemplate] -> ShowS
showList :: [MessageTemplate] -> ShowS
Prelude.Show)
mkMessageTemplate ::
  Value Prelude.Text
  -> ContentProperty
     -> Value Prelude.Text -> Value Prelude.Text -> MessageTemplate
mkMessageTemplate :: Value Text
-> ContentProperty -> Value Text -> Value Text -> MessageTemplate
mkMessageTemplate Value Text
channelSubtype ContentProperty
content Value Text
knowledgeBaseArn Value Text
name
  = MessageTemplate
      {haddock_workaround_ :: ()
haddock_workaround_ = (), channelSubtype :: Value Text
channelSubtype = Value Text
channelSubtype,
       content :: ContentProperty
content = ContentProperty
content, knowledgeBaseArn :: Value Text
knowledgeBaseArn = Value Text
knowledgeBaseArn,
       name :: Value Text
name = Value Text
name, defaultAttributes :: Maybe MessageTemplateAttributesProperty
defaultAttributes = Maybe MessageTemplateAttributesProperty
forall a. Maybe a
Prelude.Nothing,
       description :: Maybe (Value Text)
description = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       groupingConfiguration :: Maybe GroupingConfigurationProperty
groupingConfiguration = Maybe GroupingConfigurationProperty
forall a. Maybe a
Prelude.Nothing,
       language :: Maybe (Value Text)
language = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
messageTemplateAttachments = Maybe [MessageTemplateAttachmentProperty]
forall a. Maybe a
Prelude.Nothing,
       tags :: Maybe [Tag]
tags = Maybe [Tag]
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties MessageTemplate where
  toResourceProperties :: MessageTemplate -> ResourceProperties
toResourceProperties MessageTemplate {Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: MessageTemplate -> ()
channelSubtype :: MessageTemplate -> Value Text
content :: MessageTemplate -> ContentProperty
defaultAttributes :: MessageTemplate -> Maybe MessageTemplateAttributesProperty
description :: MessageTemplate -> Maybe (Value Text)
groupingConfiguration :: MessageTemplate -> Maybe GroupingConfigurationProperty
knowledgeBaseArn :: MessageTemplate -> Value Text
language :: MessageTemplate -> Maybe (Value Text)
messageTemplateAttachments :: MessageTemplate -> Maybe [MessageTemplateAttachmentProperty]
name :: MessageTemplate -> Value Text
tags :: MessageTemplate -> Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::Wisdom::MessageTemplate",
         supportsTags :: Bool
supportsTags = Bool
Prelude.True,
         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
"ChannelSubtype" 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
channelSubtype,
                            Key
"Content" Key -> ContentProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= ContentProperty
content,
                            Key
"KnowledgeBaseArn" 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
knowledgeBaseArn, Key
"Name" 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
name]
                           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                              [Key -> MessageTemplateAttributesProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DefaultAttributes" (MessageTemplateAttributesProperty -> (Key, Value))
-> Maybe MessageTemplateAttributesProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MessageTemplateAttributesProperty
defaultAttributes,
                               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 -> GroupingConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"GroupingConfiguration"
                                 (GroupingConfigurationProperty -> (Key, Value))
-> Maybe GroupingConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe GroupingConfigurationProperty
groupingConfiguration,
                               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
"Language" (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)
language,
                               Key -> [MessageTemplateAttachmentProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MessageTemplateAttachments"
                                 ([MessageTemplateAttachmentProperty] -> (Key, Value))
-> Maybe [MessageTemplateAttachmentProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [MessageTemplateAttachmentProperty]
messageTemplateAttachments,
                               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
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags]))}
instance JSON.ToJSON MessageTemplate where
  toJSON :: MessageTemplate -> Value
toJSON MessageTemplate {Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: MessageTemplate -> ()
channelSubtype :: MessageTemplate -> Value Text
content :: MessageTemplate -> ContentProperty
defaultAttributes :: MessageTemplate -> Maybe MessageTemplateAttributesProperty
description :: MessageTemplate -> Maybe (Value Text)
groupingConfiguration :: MessageTemplate -> Maybe GroupingConfigurationProperty
knowledgeBaseArn :: MessageTemplate -> Value Text
language :: MessageTemplate -> Maybe (Value Text)
messageTemplateAttachments :: MessageTemplate -> Maybe [MessageTemplateAttachmentProperty]
name :: MessageTemplate -> Value Text
tags :: MessageTemplate -> Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
    = [(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
"ChannelSubtype" 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
channelSubtype,
               Key
"Content" Key -> ContentProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= ContentProperty
content,
               Key
"KnowledgeBaseArn" 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
knowledgeBaseArn, Key
"Name" 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
name]
              ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                 [Key -> MessageTemplateAttributesProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DefaultAttributes" (MessageTemplateAttributesProperty -> (Key, Value))
-> Maybe MessageTemplateAttributesProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MessageTemplateAttributesProperty
defaultAttributes,
                  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 -> GroupingConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"GroupingConfiguration"
                    (GroupingConfigurationProperty -> (Key, Value))
-> Maybe GroupingConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe GroupingConfigurationProperty
groupingConfiguration,
                  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
"Language" (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)
language,
                  Key -> [MessageTemplateAttachmentProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MessageTemplateAttachments"
                    ([MessageTemplateAttachmentProperty] -> (Key, Value))
-> Maybe [MessageTemplateAttachmentProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [MessageTemplateAttachmentProperty]
messageTemplateAttachments,
                  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
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags])))
instance Property "ChannelSubtype" MessageTemplate where
  type PropertyType "ChannelSubtype" MessageTemplate = Value Prelude.Text
  set :: PropertyType "ChannelSubtype" MessageTemplate
-> MessageTemplate -> MessageTemplate
set PropertyType "ChannelSubtype" MessageTemplate
newValue MessageTemplate {Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: MessageTemplate -> ()
channelSubtype :: MessageTemplate -> Value Text
content :: MessageTemplate -> ContentProperty
defaultAttributes :: MessageTemplate -> Maybe MessageTemplateAttributesProperty
description :: MessageTemplate -> Maybe (Value Text)
groupingConfiguration :: MessageTemplate -> Maybe GroupingConfigurationProperty
knowledgeBaseArn :: MessageTemplate -> Value Text
language :: MessageTemplate -> Maybe (Value Text)
messageTemplateAttachments :: MessageTemplate -> Maybe [MessageTemplateAttachmentProperty]
name :: MessageTemplate -> Value Text
tags :: MessageTemplate -> Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
    = MessageTemplate {channelSubtype :: Value Text
channelSubtype = PropertyType "ChannelSubtype" MessageTemplate
Value Text
newValue, Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: ()
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
haddock_workaround_ :: ()
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
instance Property "Content" MessageTemplate where
  type PropertyType "Content" MessageTemplate = ContentProperty
  set :: PropertyType "Content" MessageTemplate
-> MessageTemplate -> MessageTemplate
set PropertyType "Content" MessageTemplate
newValue MessageTemplate {Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: MessageTemplate -> ()
channelSubtype :: MessageTemplate -> Value Text
content :: MessageTemplate -> ContentProperty
defaultAttributes :: MessageTemplate -> Maybe MessageTemplateAttributesProperty
description :: MessageTemplate -> Maybe (Value Text)
groupingConfiguration :: MessageTemplate -> Maybe GroupingConfigurationProperty
knowledgeBaseArn :: MessageTemplate -> Value Text
language :: MessageTemplate -> Maybe (Value Text)
messageTemplateAttachments :: MessageTemplate -> Maybe [MessageTemplateAttachmentProperty]
name :: MessageTemplate -> Value Text
tags :: MessageTemplate -> Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
    = MessageTemplate {content :: ContentProperty
content = PropertyType "Content" MessageTemplate
ContentProperty
newValue, Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
haddock_workaround_ :: ()
channelSubtype :: Value Text
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
instance Property "DefaultAttributes" MessageTemplate where
  type PropertyType "DefaultAttributes" MessageTemplate = MessageTemplateAttributesProperty
  set :: PropertyType "DefaultAttributes" MessageTemplate
-> MessageTemplate -> MessageTemplate
set PropertyType "DefaultAttributes" MessageTemplate
newValue MessageTemplate {Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: MessageTemplate -> ()
channelSubtype :: MessageTemplate -> Value Text
content :: MessageTemplate -> ContentProperty
defaultAttributes :: MessageTemplate -> Maybe MessageTemplateAttributesProperty
description :: MessageTemplate -> Maybe (Value Text)
groupingConfiguration :: MessageTemplate -> Maybe GroupingConfigurationProperty
knowledgeBaseArn :: MessageTemplate -> Value Text
language :: MessageTemplate -> Maybe (Value Text)
messageTemplateAttachments :: MessageTemplate -> Maybe [MessageTemplateAttachmentProperty]
name :: MessageTemplate -> Value Text
tags :: MessageTemplate -> Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
    = MessageTemplate {defaultAttributes :: Maybe MessageTemplateAttributesProperty
defaultAttributes = MessageTemplateAttributesProperty
-> Maybe MessageTemplateAttributesProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DefaultAttributes" MessageTemplate
MessageTemplateAttributesProperty
newValue, Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
()
Value Text
ContentProperty
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
instance Property "Description" MessageTemplate where
  type PropertyType "Description" MessageTemplate = Value Prelude.Text
  set :: PropertyType "Description" MessageTemplate
-> MessageTemplate -> MessageTemplate
set PropertyType "Description" MessageTemplate
newValue MessageTemplate {Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: MessageTemplate -> ()
channelSubtype :: MessageTemplate -> Value Text
content :: MessageTemplate -> ContentProperty
defaultAttributes :: MessageTemplate -> Maybe MessageTemplateAttributesProperty
description :: MessageTemplate -> Maybe (Value Text)
groupingConfiguration :: MessageTemplate -> Maybe GroupingConfigurationProperty
knowledgeBaseArn :: MessageTemplate -> Value Text
language :: MessageTemplate -> Maybe (Value Text)
messageTemplateAttachments :: MessageTemplate -> Maybe [MessageTemplateAttachmentProperty]
name :: MessageTemplate -> Value Text
tags :: MessageTemplate -> Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
    = MessageTemplate {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" MessageTemplate
Value Text
newValue, Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
instance Property "GroupingConfiguration" MessageTemplate where
  type PropertyType "GroupingConfiguration" MessageTemplate = GroupingConfigurationProperty
  set :: PropertyType "GroupingConfiguration" MessageTemplate
-> MessageTemplate -> MessageTemplate
set PropertyType "GroupingConfiguration" MessageTemplate
newValue MessageTemplate {Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: MessageTemplate -> ()
channelSubtype :: MessageTemplate -> Value Text
content :: MessageTemplate -> ContentProperty
defaultAttributes :: MessageTemplate -> Maybe MessageTemplateAttributesProperty
description :: MessageTemplate -> Maybe (Value Text)
groupingConfiguration :: MessageTemplate -> Maybe GroupingConfigurationProperty
knowledgeBaseArn :: MessageTemplate -> Value Text
language :: MessageTemplate -> Maybe (Value Text)
messageTemplateAttachments :: MessageTemplate -> Maybe [MessageTemplateAttachmentProperty]
name :: MessageTemplate -> Value Text
tags :: MessageTemplate -> Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
    = MessageTemplate
        {groupingConfiguration :: Maybe GroupingConfigurationProperty
groupingConfiguration = GroupingConfigurationProperty
-> Maybe GroupingConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "GroupingConfiguration" MessageTemplate
GroupingConfigurationProperty
newValue, Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
instance Property "KnowledgeBaseArn" MessageTemplate where
  type PropertyType "KnowledgeBaseArn" MessageTemplate = Value Prelude.Text
  set :: PropertyType "KnowledgeBaseArn" MessageTemplate
-> MessageTemplate -> MessageTemplate
set PropertyType "KnowledgeBaseArn" MessageTemplate
newValue MessageTemplate {Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: MessageTemplate -> ()
channelSubtype :: MessageTemplate -> Value Text
content :: MessageTemplate -> ContentProperty
defaultAttributes :: MessageTemplate -> Maybe MessageTemplateAttributesProperty
description :: MessageTemplate -> Maybe (Value Text)
groupingConfiguration :: MessageTemplate -> Maybe GroupingConfigurationProperty
knowledgeBaseArn :: MessageTemplate -> Value Text
language :: MessageTemplate -> Maybe (Value Text)
messageTemplateAttachments :: MessageTemplate -> Maybe [MessageTemplateAttachmentProperty]
name :: MessageTemplate -> Value Text
tags :: MessageTemplate -> Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
    = MessageTemplate {knowledgeBaseArn :: Value Text
knowledgeBaseArn = PropertyType "KnowledgeBaseArn" MessageTemplate
Value Text
newValue, Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
instance Property "Language" MessageTemplate where
  type PropertyType "Language" MessageTemplate = Value Prelude.Text
  set :: PropertyType "Language" MessageTemplate
-> MessageTemplate -> MessageTemplate
set PropertyType "Language" MessageTemplate
newValue MessageTemplate {Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: MessageTemplate -> ()
channelSubtype :: MessageTemplate -> Value Text
content :: MessageTemplate -> ContentProperty
defaultAttributes :: MessageTemplate -> Maybe MessageTemplateAttributesProperty
description :: MessageTemplate -> Maybe (Value Text)
groupingConfiguration :: MessageTemplate -> Maybe GroupingConfigurationProperty
knowledgeBaseArn :: MessageTemplate -> Value Text
language :: MessageTemplate -> Maybe (Value Text)
messageTemplateAttachments :: MessageTemplate -> Maybe [MessageTemplateAttachmentProperty]
name :: MessageTemplate -> Value Text
tags :: MessageTemplate -> Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
    = MessageTemplate {language :: Maybe (Value Text)
language = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Language" MessageTemplate
Value Text
newValue, Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
instance Property "MessageTemplateAttachments" MessageTemplate where
  type PropertyType "MessageTemplateAttachments" MessageTemplate = [MessageTemplateAttachmentProperty]
  set :: PropertyType "MessageTemplateAttachments" MessageTemplate
-> MessageTemplate -> MessageTemplate
set PropertyType "MessageTemplateAttachments" MessageTemplate
newValue MessageTemplate {Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: MessageTemplate -> ()
channelSubtype :: MessageTemplate -> Value Text
content :: MessageTemplate -> ContentProperty
defaultAttributes :: MessageTemplate -> Maybe MessageTemplateAttributesProperty
description :: MessageTemplate -> Maybe (Value Text)
groupingConfiguration :: MessageTemplate -> Maybe GroupingConfigurationProperty
knowledgeBaseArn :: MessageTemplate -> Value Text
language :: MessageTemplate -> Maybe (Value Text)
messageTemplateAttachments :: MessageTemplate -> Maybe [MessageTemplateAttachmentProperty]
name :: MessageTemplate -> Value Text
tags :: MessageTemplate -> Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
    = MessageTemplate
        {messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
messageTemplateAttachments = [MessageTemplateAttachmentProperty]
-> Maybe [MessageTemplateAttachmentProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [MessageTemplateAttachmentProperty]
PropertyType "MessageTemplateAttachments" MessageTemplate
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
name :: Value Text
tags :: Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
name :: Value Text
tags :: Maybe [Tag]
..}
instance Property "Name" MessageTemplate where
  type PropertyType "Name" MessageTemplate = Value Prelude.Text
  set :: PropertyType "Name" MessageTemplate
-> MessageTemplate -> MessageTemplate
set PropertyType "Name" MessageTemplate
newValue MessageTemplate {Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: MessageTemplate -> ()
channelSubtype :: MessageTemplate -> Value Text
content :: MessageTemplate -> ContentProperty
defaultAttributes :: MessageTemplate -> Maybe MessageTemplateAttributesProperty
description :: MessageTemplate -> Maybe (Value Text)
groupingConfiguration :: MessageTemplate -> Maybe GroupingConfigurationProperty
knowledgeBaseArn :: MessageTemplate -> Value Text
language :: MessageTemplate -> Maybe (Value Text)
messageTemplateAttachments :: MessageTemplate -> Maybe [MessageTemplateAttachmentProperty]
name :: MessageTemplate -> Value Text
tags :: MessageTemplate -> Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
    = MessageTemplate {name :: Value Text
name = PropertyType "Name" MessageTemplate
Value Text
newValue, Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
tags :: Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
tags :: Maybe [Tag]
..}
instance Property "Tags" MessageTemplate where
  type PropertyType "Tags" MessageTemplate = [Tag]
  set :: PropertyType "Tags" MessageTemplate
-> MessageTemplate -> MessageTemplate
set PropertyType "Tags" MessageTemplate
newValue MessageTemplate {Maybe [Tag]
Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: MessageTemplate -> ()
channelSubtype :: MessageTemplate -> Value Text
content :: MessageTemplate -> ContentProperty
defaultAttributes :: MessageTemplate -> Maybe MessageTemplateAttributesProperty
description :: MessageTemplate -> Maybe (Value Text)
groupingConfiguration :: MessageTemplate -> Maybe GroupingConfigurationProperty
knowledgeBaseArn :: MessageTemplate -> Value Text
language :: MessageTemplate -> Maybe (Value Text)
messageTemplateAttachments :: MessageTemplate -> Maybe [MessageTemplateAttachmentProperty]
name :: MessageTemplate -> Value Text
tags :: MessageTemplate -> Maybe [Tag]
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
tags :: Maybe [Tag]
..}
    = MessageTemplate {tags :: Maybe [Tag]
tags = [Tag] -> Maybe [Tag]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [Tag]
PropertyType "Tags" MessageTemplate
newValue, Maybe [MessageTemplateAttachmentProperty]
Maybe (Value Text)
Maybe GroupingConfigurationProperty
Maybe MessageTemplateAttributesProperty
()
Value Text
ContentProperty
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
haddock_workaround_ :: ()
channelSubtype :: Value Text
content :: ContentProperty
defaultAttributes :: Maybe MessageTemplateAttributesProperty
description :: Maybe (Value Text)
groupingConfiguration :: Maybe GroupingConfigurationProperty
knowledgeBaseArn :: Value Text
language :: Maybe (Value Text)
messageTemplateAttachments :: Maybe [MessageTemplateAttachmentProperty]
name :: Value Text
..}