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