module Stratosphere.Bedrock.Flow.PromptTemplateConfigurationProperty (
module Exports, PromptTemplateConfigurationProperty(..),
mkPromptTemplateConfigurationProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.Bedrock.Flow.TextPromptTemplateConfigurationProperty as Exports
import Stratosphere.ResourceProperties
data PromptTemplateConfigurationProperty
=
PromptTemplateConfigurationProperty {PromptTemplateConfigurationProperty -> ()
haddock_workaround_ :: (),
PromptTemplateConfigurationProperty
-> TextPromptTemplateConfigurationProperty
text :: TextPromptTemplateConfigurationProperty}
deriving stock (PromptTemplateConfigurationProperty
-> PromptTemplateConfigurationProperty -> Bool
(PromptTemplateConfigurationProperty
-> PromptTemplateConfigurationProperty -> Bool)
-> (PromptTemplateConfigurationProperty
-> PromptTemplateConfigurationProperty -> Bool)
-> Eq PromptTemplateConfigurationProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: PromptTemplateConfigurationProperty
-> PromptTemplateConfigurationProperty -> Bool
== :: PromptTemplateConfigurationProperty
-> PromptTemplateConfigurationProperty -> Bool
$c/= :: PromptTemplateConfigurationProperty
-> PromptTemplateConfigurationProperty -> Bool
/= :: PromptTemplateConfigurationProperty
-> PromptTemplateConfigurationProperty -> Bool
Prelude.Eq, Int -> PromptTemplateConfigurationProperty -> ShowS
[PromptTemplateConfigurationProperty] -> ShowS
PromptTemplateConfigurationProperty -> String
(Int -> PromptTemplateConfigurationProperty -> ShowS)
-> (PromptTemplateConfigurationProperty -> String)
-> ([PromptTemplateConfigurationProperty] -> ShowS)
-> Show PromptTemplateConfigurationProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> PromptTemplateConfigurationProperty -> ShowS
showsPrec :: Int -> PromptTemplateConfigurationProperty -> ShowS
$cshow :: PromptTemplateConfigurationProperty -> String
show :: PromptTemplateConfigurationProperty -> String
$cshowList :: [PromptTemplateConfigurationProperty] -> ShowS
showList :: [PromptTemplateConfigurationProperty] -> ShowS
Prelude.Show)
mkPromptTemplateConfigurationProperty ::
TextPromptTemplateConfigurationProperty
-> PromptTemplateConfigurationProperty
mkPromptTemplateConfigurationProperty :: TextPromptTemplateConfigurationProperty
-> PromptTemplateConfigurationProperty
mkPromptTemplateConfigurationProperty TextPromptTemplateConfigurationProperty
text
= PromptTemplateConfigurationProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), text :: TextPromptTemplateConfigurationProperty
text = TextPromptTemplateConfigurationProperty
text}
instance ToResourceProperties PromptTemplateConfigurationProperty where
toResourceProperties :: PromptTemplateConfigurationProperty -> ResourceProperties
toResourceProperties PromptTemplateConfigurationProperty {()
TextPromptTemplateConfigurationProperty
haddock_workaround_ :: PromptTemplateConfigurationProperty -> ()
text :: PromptTemplateConfigurationProperty
-> TextPromptTemplateConfigurationProperty
haddock_workaround_ :: ()
text :: TextPromptTemplateConfigurationProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::Bedrock::Flow.PromptTemplateConfiguration",
supportsTags :: Bool
supportsTags = Bool
Prelude.False, properties :: Object
properties = [Key
"Text" Key -> TextPromptTemplateConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= TextPromptTemplateConfigurationProperty
text]}
instance JSON.ToJSON PromptTemplateConfigurationProperty where
toJSON :: PromptTemplateConfigurationProperty -> Value
toJSON PromptTemplateConfigurationProperty {()
TextPromptTemplateConfigurationProperty
haddock_workaround_ :: PromptTemplateConfigurationProperty -> ()
text :: PromptTemplateConfigurationProperty
-> TextPromptTemplateConfigurationProperty
haddock_workaround_ :: ()
text :: TextPromptTemplateConfigurationProperty
..}
= [(Key, Value)] -> Value
JSON.object [Key
"Text" Key -> TextPromptTemplateConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= TextPromptTemplateConfigurationProperty
text]
instance Property "Text" PromptTemplateConfigurationProperty where
type PropertyType "Text" PromptTemplateConfigurationProperty = TextPromptTemplateConfigurationProperty
set :: PropertyType "Text" PromptTemplateConfigurationProperty
-> PromptTemplateConfigurationProperty
-> PromptTemplateConfigurationProperty
set PropertyType "Text" PromptTemplateConfigurationProperty
newValue PromptTemplateConfigurationProperty {()
TextPromptTemplateConfigurationProperty
haddock_workaround_ :: PromptTemplateConfigurationProperty -> ()
text :: PromptTemplateConfigurationProperty
-> TextPromptTemplateConfigurationProperty
haddock_workaround_ :: ()
text :: TextPromptTemplateConfigurationProperty
..}
= PromptTemplateConfigurationProperty {text :: TextPromptTemplateConfigurationProperty
text = PropertyType "Text" PromptTemplateConfigurationProperty
TextPromptTemplateConfigurationProperty
newValue, ()
haddock_workaround_ :: ()
haddock_workaround_ :: ()
..}