module Stratosphere.BedrockAgentCore.Runtime (
        module Exports, Runtime(..), mkRuntime
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.BedrockAgentCore.Runtime.AgentRuntimeArtifactProperty as Exports
import {-# SOURCE #-} Stratosphere.BedrockAgentCore.Runtime.AuthorizerConfigurationProperty as Exports
import {-# SOURCE #-} Stratosphere.BedrockAgentCore.Runtime.NetworkConfigurationProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data Runtime
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-bedrockagentcore-runtime.html>
    Runtime {Runtime -> ()
haddock_workaround_ :: (),
             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-bedrockagentcore-runtime.html#cfn-bedrockagentcore-runtime-agentruntimeartifact>
             Runtime -> AgentRuntimeArtifactProperty
agentRuntimeArtifact :: AgentRuntimeArtifactProperty,
             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-bedrockagentcore-runtime.html#cfn-bedrockagentcore-runtime-agentruntimename>
             Runtime -> Value Text
agentRuntimeName :: (Value Prelude.Text),
             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-bedrockagentcore-runtime.html#cfn-bedrockagentcore-runtime-authorizerconfiguration>
             Runtime -> Maybe AuthorizerConfigurationProperty
authorizerConfiguration :: (Prelude.Maybe AuthorizerConfigurationProperty),
             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-bedrockagentcore-runtime.html#cfn-bedrockagentcore-runtime-description>
             Runtime -> Maybe (Value Text)
description :: (Prelude.Maybe (Value Prelude.Text)),
             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-bedrockagentcore-runtime.html#cfn-bedrockagentcore-runtime-environmentvariables>
             Runtime -> Maybe (Map Text (Value Text))
environmentVariables :: (Prelude.Maybe (Prelude.Map Prelude.Text (Value Prelude.Text))),
             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-bedrockagentcore-runtime.html#cfn-bedrockagentcore-runtime-networkconfiguration>
             Runtime -> NetworkConfigurationProperty
networkConfiguration :: NetworkConfigurationProperty,
             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-bedrockagentcore-runtime.html#cfn-bedrockagentcore-runtime-protocolconfiguration>
             Runtime -> Maybe (Value Text)
protocolConfiguration :: (Prelude.Maybe (Value Prelude.Text)),
             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-bedrockagentcore-runtime.html#cfn-bedrockagentcore-runtime-rolearn>
             Runtime -> Value Text
roleArn :: (Value Prelude.Text),
             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-bedrockagentcore-runtime.html#cfn-bedrockagentcore-runtime-tags>
             Runtime -> Maybe (Map Text (Value Text))
tags :: (Prelude.Maybe (Prelude.Map Prelude.Text (Value Prelude.Text)))}
  deriving stock (Runtime -> Runtime -> Bool
(Runtime -> Runtime -> Bool)
-> (Runtime -> Runtime -> Bool) -> Eq Runtime
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Runtime -> Runtime -> Bool
== :: Runtime -> Runtime -> Bool
$c/= :: Runtime -> Runtime -> Bool
/= :: Runtime -> Runtime -> Bool
Prelude.Eq, Int -> Runtime -> ShowS
[Runtime] -> ShowS
Runtime -> String
(Int -> Runtime -> ShowS)
-> (Runtime -> String) -> ([Runtime] -> ShowS) -> Show Runtime
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Runtime -> ShowS
showsPrec :: Int -> Runtime -> ShowS
$cshow :: Runtime -> String
show :: Runtime -> String
$cshowList :: [Runtime] -> ShowS
showList :: [Runtime] -> ShowS
Prelude.Show)
mkRuntime ::
  AgentRuntimeArtifactProperty
  -> Value Prelude.Text
     -> NetworkConfigurationProperty -> Value Prelude.Text -> Runtime
mkRuntime :: AgentRuntimeArtifactProperty
-> Value Text
-> NetworkConfigurationProperty
-> Value Text
-> Runtime
mkRuntime
  AgentRuntimeArtifactProperty
agentRuntimeArtifact
  Value Text
agentRuntimeName
  NetworkConfigurationProperty
networkConfiguration
  Value Text
roleArn
  = Runtime
      {haddock_workaround_ :: ()
haddock_workaround_ = (),
       agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeArtifact = AgentRuntimeArtifactProperty
agentRuntimeArtifact,
       agentRuntimeName :: Value Text
agentRuntimeName = Value Text
agentRuntimeName,
       networkConfiguration :: NetworkConfigurationProperty
networkConfiguration = NetworkConfigurationProperty
networkConfiguration, roleArn :: Value Text
roleArn = Value Text
roleArn,
       authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
authorizerConfiguration = Maybe AuthorizerConfigurationProperty
forall a. Maybe a
Prelude.Nothing,
       description :: Maybe (Value Text)
description = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       environmentVariables :: Maybe (Map Text (Value Text))
environmentVariables = Maybe (Map Text (Value Text))
forall a. Maybe a
Prelude.Nothing,
       protocolConfiguration :: Maybe (Value Text)
protocolConfiguration = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, tags :: Maybe (Map Text (Value Text))
tags = Maybe (Map Text (Value Text))
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties Runtime where
  toResourceProperties :: Runtime -> ResourceProperties
toResourceProperties Runtime {Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: Runtime -> ()
agentRuntimeArtifact :: Runtime -> AgentRuntimeArtifactProperty
agentRuntimeName :: Runtime -> Value Text
authorizerConfiguration :: Runtime -> Maybe AuthorizerConfigurationProperty
description :: Runtime -> Maybe (Value Text)
environmentVariables :: Runtime -> Maybe (Map Text (Value Text))
networkConfiguration :: Runtime -> NetworkConfigurationProperty
protocolConfiguration :: Runtime -> Maybe (Value Text)
roleArn :: Runtime -> Value Text
tags :: Runtime -> Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::BedrockAgentCore::Runtime",
         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
"AgentRuntimeArtifact" Key -> AgentRuntimeArtifactProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= AgentRuntimeArtifactProperty
agentRuntimeArtifact,
                            Key
"AgentRuntimeName" 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
agentRuntimeName,
                            Key
"NetworkConfiguration" Key -> NetworkConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= NetworkConfigurationProperty
networkConfiguration,
                            Key
"RoleArn" 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
roleArn]
                           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                              [Key -> AuthorizerConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AuthorizerConfiguration"
                                 (AuthorizerConfigurationProperty -> (Key, Value))
-> Maybe AuthorizerConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AuthorizerConfigurationProperty
authorizerConfiguration,
                               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 -> Map Text (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
"EnvironmentVariables" (Map Text (Value Text) -> (Key, Value))
-> Maybe (Map Text (Value Text)) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text (Value Text))
environmentVariables,
                               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
"ProtocolConfiguration"
                                 (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)
protocolConfiguration,
                               Key -> Map Text (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
"Tags" (Map Text (Value Text) -> (Key, Value))
-> Maybe (Map Text (Value Text)) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text (Value Text))
tags]))}
instance JSON.ToJSON Runtime where
  toJSON :: Runtime -> Value
toJSON Runtime {Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: Runtime -> ()
agentRuntimeArtifact :: Runtime -> AgentRuntimeArtifactProperty
agentRuntimeName :: Runtime -> Value Text
authorizerConfiguration :: Runtime -> Maybe AuthorizerConfigurationProperty
description :: Runtime -> Maybe (Value Text)
environmentVariables :: Runtime -> Maybe (Map Text (Value Text))
networkConfiguration :: Runtime -> NetworkConfigurationProperty
protocolConfiguration :: Runtime -> Maybe (Value Text)
roleArn :: Runtime -> Value Text
tags :: Runtime -> Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
    = [(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
"AgentRuntimeArtifact" Key -> AgentRuntimeArtifactProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= AgentRuntimeArtifactProperty
agentRuntimeArtifact,
               Key
"AgentRuntimeName" 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
agentRuntimeName,
               Key
"NetworkConfiguration" Key -> NetworkConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= NetworkConfigurationProperty
networkConfiguration,
               Key
"RoleArn" 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
roleArn]
              ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                 [Key -> AuthorizerConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AuthorizerConfiguration"
                    (AuthorizerConfigurationProperty -> (Key, Value))
-> Maybe AuthorizerConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AuthorizerConfigurationProperty
authorizerConfiguration,
                  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 -> Map Text (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
"EnvironmentVariables" (Map Text (Value Text) -> (Key, Value))
-> Maybe (Map Text (Value Text)) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text (Value Text))
environmentVariables,
                  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
"ProtocolConfiguration"
                    (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)
protocolConfiguration,
                  Key -> Map Text (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
"Tags" (Map Text (Value Text) -> (Key, Value))
-> Maybe (Map Text (Value Text)) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Map Text (Value Text))
tags])))
instance Property "AgentRuntimeArtifact" Runtime where
  type PropertyType "AgentRuntimeArtifact" Runtime = AgentRuntimeArtifactProperty
  set :: PropertyType "AgentRuntimeArtifact" Runtime -> Runtime -> Runtime
set PropertyType "AgentRuntimeArtifact" Runtime
newValue Runtime {Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: Runtime -> ()
agentRuntimeArtifact :: Runtime -> AgentRuntimeArtifactProperty
agentRuntimeName :: Runtime -> Value Text
authorizerConfiguration :: Runtime -> Maybe AuthorizerConfigurationProperty
description :: Runtime -> Maybe (Value Text)
environmentVariables :: Runtime -> Maybe (Map Text (Value Text))
networkConfiguration :: Runtime -> NetworkConfigurationProperty
protocolConfiguration :: Runtime -> Maybe (Value Text)
roleArn :: Runtime -> Value Text
tags :: Runtime -> Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
    = Runtime {agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeArtifact = PropertyType "AgentRuntimeArtifact" Runtime
AgentRuntimeArtifactProperty
newValue, Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
NetworkConfigurationProperty
haddock_workaround_ :: ()
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
instance Property "AgentRuntimeName" Runtime where
  type PropertyType "AgentRuntimeName" Runtime = Value Prelude.Text
  set :: PropertyType "AgentRuntimeName" Runtime -> Runtime -> Runtime
set PropertyType "AgentRuntimeName" Runtime
newValue Runtime {Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: Runtime -> ()
agentRuntimeArtifact :: Runtime -> AgentRuntimeArtifactProperty
agentRuntimeName :: Runtime -> Value Text
authorizerConfiguration :: Runtime -> Maybe AuthorizerConfigurationProperty
description :: Runtime -> Maybe (Value Text)
environmentVariables :: Runtime -> Maybe (Map Text (Value Text))
networkConfiguration :: Runtime -> NetworkConfigurationProperty
protocolConfiguration :: Runtime -> Maybe (Value Text)
roleArn :: Runtime -> Value Text
tags :: Runtime -> Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
    = Runtime {agentRuntimeName :: Value Text
agentRuntimeName = PropertyType "AgentRuntimeName" Runtime
Value Text
newValue, Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
instance Property "AuthorizerConfiguration" Runtime where
  type PropertyType "AuthorizerConfiguration" Runtime = AuthorizerConfigurationProperty
  set :: PropertyType "AuthorizerConfiguration" Runtime
-> Runtime -> Runtime
set PropertyType "AuthorizerConfiguration" Runtime
newValue Runtime {Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: Runtime -> ()
agentRuntimeArtifact :: Runtime -> AgentRuntimeArtifactProperty
agentRuntimeName :: Runtime -> Value Text
authorizerConfiguration :: Runtime -> Maybe AuthorizerConfigurationProperty
description :: Runtime -> Maybe (Value Text)
environmentVariables :: Runtime -> Maybe (Map Text (Value Text))
networkConfiguration :: Runtime -> NetworkConfigurationProperty
protocolConfiguration :: Runtime -> Maybe (Value Text)
roleArn :: Runtime -> Value Text
tags :: Runtime -> Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
    = Runtime {authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
authorizerConfiguration = AuthorizerConfigurationProperty
-> Maybe AuthorizerConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AuthorizerConfiguration" Runtime
AuthorizerConfigurationProperty
newValue, Maybe (Map Text (Value Text))
Maybe (Value Text)
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
instance Property "Description" Runtime where
  type PropertyType "Description" Runtime = Value Prelude.Text
  set :: PropertyType "Description" Runtime -> Runtime -> Runtime
set PropertyType "Description" Runtime
newValue Runtime {Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: Runtime -> ()
agentRuntimeArtifact :: Runtime -> AgentRuntimeArtifactProperty
agentRuntimeName :: Runtime -> Value Text
authorizerConfiguration :: Runtime -> Maybe AuthorizerConfigurationProperty
description :: Runtime -> Maybe (Value Text)
environmentVariables :: Runtime -> Maybe (Map Text (Value Text))
networkConfiguration :: Runtime -> NetworkConfigurationProperty
protocolConfiguration :: Runtime -> Maybe (Value Text)
roleArn :: Runtime -> Value Text
tags :: Runtime -> Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
    = Runtime {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" Runtime
Value Text
newValue, Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
instance Property "EnvironmentVariables" Runtime where
  type PropertyType "EnvironmentVariables" Runtime = Prelude.Map Prelude.Text (Value Prelude.Text)
  set :: PropertyType "EnvironmentVariables" Runtime -> Runtime -> Runtime
set PropertyType "EnvironmentVariables" Runtime
newValue Runtime {Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: Runtime -> ()
agentRuntimeArtifact :: Runtime -> AgentRuntimeArtifactProperty
agentRuntimeName :: Runtime -> Value Text
authorizerConfiguration :: Runtime -> Maybe AuthorizerConfigurationProperty
description :: Runtime -> Maybe (Value Text)
environmentVariables :: Runtime -> Maybe (Map Text (Value Text))
networkConfiguration :: Runtime -> NetworkConfigurationProperty
protocolConfiguration :: Runtime -> Maybe (Value Text)
roleArn :: Runtime -> Value Text
tags :: Runtime -> Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
    = Runtime {environmentVariables :: Maybe (Map Text (Value Text))
environmentVariables = Map Text (Value Text) -> Maybe (Map Text (Value Text))
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure Map Text (Value Text)
PropertyType "EnvironmentVariables" Runtime
newValue, Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
instance Property "NetworkConfiguration" Runtime where
  type PropertyType "NetworkConfiguration" Runtime = NetworkConfigurationProperty
  set :: PropertyType "NetworkConfiguration" Runtime -> Runtime -> Runtime
set PropertyType "NetworkConfiguration" Runtime
newValue Runtime {Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: Runtime -> ()
agentRuntimeArtifact :: Runtime -> AgentRuntimeArtifactProperty
agentRuntimeName :: Runtime -> Value Text
authorizerConfiguration :: Runtime -> Maybe AuthorizerConfigurationProperty
description :: Runtime -> Maybe (Value Text)
environmentVariables :: Runtime -> Maybe (Map Text (Value Text))
networkConfiguration :: Runtime -> NetworkConfigurationProperty
protocolConfiguration :: Runtime -> Maybe (Value Text)
roleArn :: Runtime -> Value Text
tags :: Runtime -> Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
    = Runtime {networkConfiguration :: NetworkConfigurationProperty
networkConfiguration = PropertyType "NetworkConfiguration" Runtime
NetworkConfigurationProperty
newValue, Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
instance Property "ProtocolConfiguration" Runtime where
  type PropertyType "ProtocolConfiguration" Runtime = Value Prelude.Text
  set :: PropertyType "ProtocolConfiguration" Runtime -> Runtime -> Runtime
set PropertyType "ProtocolConfiguration" Runtime
newValue Runtime {Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: Runtime -> ()
agentRuntimeArtifact :: Runtime -> AgentRuntimeArtifactProperty
agentRuntimeName :: Runtime -> Value Text
authorizerConfiguration :: Runtime -> Maybe AuthorizerConfigurationProperty
description :: Runtime -> Maybe (Value Text)
environmentVariables :: Runtime -> Maybe (Map Text (Value Text))
networkConfiguration :: Runtime -> NetworkConfigurationProperty
protocolConfiguration :: Runtime -> Maybe (Value Text)
roleArn :: Runtime -> Value Text
tags :: Runtime -> Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
    = Runtime {protocolConfiguration :: Maybe (Value Text)
protocolConfiguration = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ProtocolConfiguration" Runtime
Value Text
newValue, Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
instance Property "RoleArn" Runtime where
  type PropertyType "RoleArn" Runtime = Value Prelude.Text
  set :: PropertyType "RoleArn" Runtime -> Runtime -> Runtime
set PropertyType "RoleArn" Runtime
newValue Runtime {Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: Runtime -> ()
agentRuntimeArtifact :: Runtime -> AgentRuntimeArtifactProperty
agentRuntimeName :: Runtime -> Value Text
authorizerConfiguration :: Runtime -> Maybe AuthorizerConfigurationProperty
description :: Runtime -> Maybe (Value Text)
environmentVariables :: Runtime -> Maybe (Map Text (Value Text))
networkConfiguration :: Runtime -> NetworkConfigurationProperty
protocolConfiguration :: Runtime -> Maybe (Value Text)
roleArn :: Runtime -> Value Text
tags :: Runtime -> Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..} = Runtime {roleArn :: Value Text
roleArn = PropertyType "RoleArn" Runtime
Value Text
newValue, Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
tags :: Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
tags :: Maybe (Map Text (Value Text))
..}
instance Property "Tags" Runtime where
  type PropertyType "Tags" Runtime = Prelude.Map Prelude.Text (Value Prelude.Text)
  set :: PropertyType "Tags" Runtime -> Runtime -> Runtime
set PropertyType "Tags" Runtime
newValue Runtime {Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: Runtime -> ()
agentRuntimeArtifact :: Runtime -> AgentRuntimeArtifactProperty
agentRuntimeName :: Runtime -> Value Text
authorizerConfiguration :: Runtime -> Maybe AuthorizerConfigurationProperty
description :: Runtime -> Maybe (Value Text)
environmentVariables :: Runtime -> Maybe (Map Text (Value Text))
networkConfiguration :: Runtime -> NetworkConfigurationProperty
protocolConfiguration :: Runtime -> Maybe (Value Text)
roleArn :: Runtime -> Value Text
tags :: Runtime -> Maybe (Map Text (Value Text))
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
tags :: Maybe (Map Text (Value Text))
..}
    = Runtime {tags :: Maybe (Map Text (Value Text))
tags = Map Text (Value Text) -> Maybe (Map Text (Value Text))
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure Map Text (Value Text)
PropertyType "Tags" Runtime
newValue, Maybe (Map Text (Value Text))
Maybe (Value Text)
Maybe AuthorizerConfigurationProperty
()
Value Text
AgentRuntimeArtifactProperty
NetworkConfigurationProperty
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
haddock_workaround_ :: ()
agentRuntimeArtifact :: AgentRuntimeArtifactProperty
agentRuntimeName :: Value Text
authorizerConfiguration :: Maybe AuthorizerConfigurationProperty
description :: Maybe (Value Text)
environmentVariables :: Maybe (Map Text (Value Text))
networkConfiguration :: NetworkConfigurationProperty
protocolConfiguration :: Maybe (Value Text)
roleArn :: Value Text
..}