module Stratosphere.Bedrock.FlowVersion.PromptFlowNodeResourceConfigurationProperty (
PromptFlowNodeResourceConfigurationProperty(..),
mkPromptFlowNodeResourceConfigurationProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data PromptFlowNodeResourceConfigurationProperty
=
PromptFlowNodeResourceConfigurationProperty {PromptFlowNodeResourceConfigurationProperty -> ()
haddock_workaround_ :: (),
PromptFlowNodeResourceConfigurationProperty -> Value Text
promptArn :: (Value Prelude.Text)}
deriving stock (PromptFlowNodeResourceConfigurationProperty
-> PromptFlowNodeResourceConfigurationProperty -> Bool
(PromptFlowNodeResourceConfigurationProperty
-> PromptFlowNodeResourceConfigurationProperty -> Bool)
-> (PromptFlowNodeResourceConfigurationProperty
-> PromptFlowNodeResourceConfigurationProperty -> Bool)
-> Eq PromptFlowNodeResourceConfigurationProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: PromptFlowNodeResourceConfigurationProperty
-> PromptFlowNodeResourceConfigurationProperty -> Bool
== :: PromptFlowNodeResourceConfigurationProperty
-> PromptFlowNodeResourceConfigurationProperty -> Bool
$c/= :: PromptFlowNodeResourceConfigurationProperty
-> PromptFlowNodeResourceConfigurationProperty -> Bool
/= :: PromptFlowNodeResourceConfigurationProperty
-> PromptFlowNodeResourceConfigurationProperty -> Bool
Prelude.Eq, Int -> PromptFlowNodeResourceConfigurationProperty -> ShowS
[PromptFlowNodeResourceConfigurationProperty] -> ShowS
PromptFlowNodeResourceConfigurationProperty -> String
(Int -> PromptFlowNodeResourceConfigurationProperty -> ShowS)
-> (PromptFlowNodeResourceConfigurationProperty -> String)
-> ([PromptFlowNodeResourceConfigurationProperty] -> ShowS)
-> Show PromptFlowNodeResourceConfigurationProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> PromptFlowNodeResourceConfigurationProperty -> ShowS
showsPrec :: Int -> PromptFlowNodeResourceConfigurationProperty -> ShowS
$cshow :: PromptFlowNodeResourceConfigurationProperty -> String
show :: PromptFlowNodeResourceConfigurationProperty -> String
$cshowList :: [PromptFlowNodeResourceConfigurationProperty] -> ShowS
showList :: [PromptFlowNodeResourceConfigurationProperty] -> ShowS
Prelude.Show)
mkPromptFlowNodeResourceConfigurationProperty ::
Value Prelude.Text -> PromptFlowNodeResourceConfigurationProperty
mkPromptFlowNodeResourceConfigurationProperty :: Value Text -> PromptFlowNodeResourceConfigurationProperty
mkPromptFlowNodeResourceConfigurationProperty Value Text
promptArn
= PromptFlowNodeResourceConfigurationProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), promptArn :: Value Text
promptArn = Value Text
promptArn}
instance ToResourceProperties PromptFlowNodeResourceConfigurationProperty where
toResourceProperties :: PromptFlowNodeResourceConfigurationProperty -> ResourceProperties
toResourceProperties
PromptFlowNodeResourceConfigurationProperty {()
Value Text
haddock_workaround_ :: PromptFlowNodeResourceConfigurationProperty -> ()
promptArn :: PromptFlowNodeResourceConfigurationProperty -> Value Text
haddock_workaround_ :: ()
promptArn :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::Bedrock::FlowVersion.PromptFlowNodeResourceConfiguration",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"PromptArn" 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
promptArn]}
instance JSON.ToJSON PromptFlowNodeResourceConfigurationProperty where
toJSON :: PromptFlowNodeResourceConfigurationProperty -> Value
toJSON PromptFlowNodeResourceConfigurationProperty {()
Value Text
haddock_workaround_ :: PromptFlowNodeResourceConfigurationProperty -> ()
promptArn :: PromptFlowNodeResourceConfigurationProperty -> Value Text
haddock_workaround_ :: ()
promptArn :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object [Key
"PromptArn" 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
promptArn]
instance Property "PromptArn" PromptFlowNodeResourceConfigurationProperty where
type PropertyType "PromptArn" PromptFlowNodeResourceConfigurationProperty = Value Prelude.Text
set :: PropertyType
"PromptArn" PromptFlowNodeResourceConfigurationProperty
-> PromptFlowNodeResourceConfigurationProperty
-> PromptFlowNodeResourceConfigurationProperty
set PropertyType
"PromptArn" PromptFlowNodeResourceConfigurationProperty
newValue PromptFlowNodeResourceConfigurationProperty {()
Value Text
haddock_workaround_ :: PromptFlowNodeResourceConfigurationProperty -> ()
promptArn :: PromptFlowNodeResourceConfigurationProperty -> Value Text
haddock_workaround_ :: ()
promptArn :: Value Text
..}
= PromptFlowNodeResourceConfigurationProperty
{promptArn :: Value Text
promptArn = PropertyType
"PromptArn" PromptFlowNodeResourceConfigurationProperty
Value Text
newValue, ()
haddock_workaround_ :: ()
haddock_workaround_ :: ()
..}