module Stratosphere.BedrockAgentCore.Memory.CustomConfigurationInputProperty (
module Exports, CustomConfigurationInputProperty(..),
mkCustomConfigurationInputProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.BedrockAgentCore.Memory.SelfManagedConfigurationProperty as Exports
import {-# SOURCE #-} Stratosphere.BedrockAgentCore.Memory.SemanticOverrideProperty as Exports
import {-# SOURCE #-} Stratosphere.BedrockAgentCore.Memory.SummaryOverrideProperty as Exports
import {-# SOURCE #-} Stratosphere.BedrockAgentCore.Memory.UserPreferenceOverrideProperty as Exports
import Stratosphere.ResourceProperties
data CustomConfigurationInputProperty
=
CustomConfigurationInputProperty {CustomConfigurationInputProperty -> ()
haddock_workaround_ :: (),
CustomConfigurationInputProperty
-> Maybe SelfManagedConfigurationProperty
selfManagedConfiguration :: (Prelude.Maybe SelfManagedConfigurationProperty),
CustomConfigurationInputProperty -> Maybe SemanticOverrideProperty
semanticOverride :: (Prelude.Maybe SemanticOverrideProperty),
CustomConfigurationInputProperty -> Maybe SummaryOverrideProperty
summaryOverride :: (Prelude.Maybe SummaryOverrideProperty),
CustomConfigurationInputProperty
-> Maybe UserPreferenceOverrideProperty
userPreferenceOverride :: (Prelude.Maybe UserPreferenceOverrideProperty)}
deriving stock (CustomConfigurationInputProperty
-> CustomConfigurationInputProperty -> Bool
(CustomConfigurationInputProperty
-> CustomConfigurationInputProperty -> Bool)
-> (CustomConfigurationInputProperty
-> CustomConfigurationInputProperty -> Bool)
-> Eq CustomConfigurationInputProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: CustomConfigurationInputProperty
-> CustomConfigurationInputProperty -> Bool
== :: CustomConfigurationInputProperty
-> CustomConfigurationInputProperty -> Bool
$c/= :: CustomConfigurationInputProperty
-> CustomConfigurationInputProperty -> Bool
/= :: CustomConfigurationInputProperty
-> CustomConfigurationInputProperty -> Bool
Prelude.Eq, Int -> CustomConfigurationInputProperty -> ShowS
[CustomConfigurationInputProperty] -> ShowS
CustomConfigurationInputProperty -> String
(Int -> CustomConfigurationInputProperty -> ShowS)
-> (CustomConfigurationInputProperty -> String)
-> ([CustomConfigurationInputProperty] -> ShowS)
-> Show CustomConfigurationInputProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> CustomConfigurationInputProperty -> ShowS
showsPrec :: Int -> CustomConfigurationInputProperty -> ShowS
$cshow :: CustomConfigurationInputProperty -> String
show :: CustomConfigurationInputProperty -> String
$cshowList :: [CustomConfigurationInputProperty] -> ShowS
showList :: [CustomConfigurationInputProperty] -> ShowS
Prelude.Show)
mkCustomConfigurationInputProperty ::
CustomConfigurationInputProperty
mkCustomConfigurationInputProperty :: CustomConfigurationInputProperty
mkCustomConfigurationInputProperty
= CustomConfigurationInputProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (),
selfManagedConfiguration :: Maybe SelfManagedConfigurationProperty
selfManagedConfiguration = Maybe SelfManagedConfigurationProperty
forall a. Maybe a
Prelude.Nothing,
semanticOverride :: Maybe SemanticOverrideProperty
semanticOverride = Maybe SemanticOverrideProperty
forall a. Maybe a
Prelude.Nothing,
summaryOverride :: Maybe SummaryOverrideProperty
summaryOverride = Maybe SummaryOverrideProperty
forall a. Maybe a
Prelude.Nothing,
userPreferenceOverride :: Maybe UserPreferenceOverrideProperty
userPreferenceOverride = Maybe UserPreferenceOverrideProperty
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties CustomConfigurationInputProperty where
toResourceProperties :: CustomConfigurationInputProperty -> ResourceProperties
toResourceProperties CustomConfigurationInputProperty {Maybe SemanticOverrideProperty
Maybe SummaryOverrideProperty
Maybe SelfManagedConfigurationProperty
Maybe UserPreferenceOverrideProperty
()
haddock_workaround_ :: CustomConfigurationInputProperty -> ()
selfManagedConfiguration :: CustomConfigurationInputProperty
-> Maybe SelfManagedConfigurationProperty
semanticOverride :: CustomConfigurationInputProperty -> Maybe SemanticOverrideProperty
summaryOverride :: CustomConfigurationInputProperty -> Maybe SummaryOverrideProperty
userPreferenceOverride :: CustomConfigurationInputProperty
-> Maybe UserPreferenceOverrideProperty
haddock_workaround_ :: ()
selfManagedConfiguration :: Maybe SelfManagedConfigurationProperty
semanticOverride :: Maybe SemanticOverrideProperty
summaryOverride :: Maybe SummaryOverrideProperty
userPreferenceOverride :: Maybe UserPreferenceOverrideProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::BedrockAgentCore::Memory.CustomConfigurationInput",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> SelfManagedConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SelfManagedConfiguration"
(SelfManagedConfigurationProperty -> (Key, Value))
-> Maybe SelfManagedConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SelfManagedConfigurationProperty
selfManagedConfiguration,
Key -> SemanticOverrideProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SemanticOverride" (SemanticOverrideProperty -> (Key, Value))
-> Maybe SemanticOverrideProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SemanticOverrideProperty
semanticOverride,
Key -> SummaryOverrideProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SummaryOverride" (SummaryOverrideProperty -> (Key, Value))
-> Maybe SummaryOverrideProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SummaryOverrideProperty
summaryOverride,
Key -> UserPreferenceOverrideProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"UserPreferenceOverride"
(UserPreferenceOverrideProperty -> (Key, Value))
-> Maybe UserPreferenceOverrideProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe UserPreferenceOverrideProperty
userPreferenceOverride])}
instance JSON.ToJSON CustomConfigurationInputProperty where
toJSON :: CustomConfigurationInputProperty -> Value
toJSON CustomConfigurationInputProperty {Maybe SemanticOverrideProperty
Maybe SummaryOverrideProperty
Maybe SelfManagedConfigurationProperty
Maybe UserPreferenceOverrideProperty
()
haddock_workaround_ :: CustomConfigurationInputProperty -> ()
selfManagedConfiguration :: CustomConfigurationInputProperty
-> Maybe SelfManagedConfigurationProperty
semanticOverride :: CustomConfigurationInputProperty -> Maybe SemanticOverrideProperty
summaryOverride :: CustomConfigurationInputProperty -> Maybe SummaryOverrideProperty
userPreferenceOverride :: CustomConfigurationInputProperty
-> Maybe UserPreferenceOverrideProperty
haddock_workaround_ :: ()
selfManagedConfiguration :: Maybe SelfManagedConfigurationProperty
semanticOverride :: Maybe SemanticOverrideProperty
summaryOverride :: Maybe SummaryOverrideProperty
userPreferenceOverride :: Maybe UserPreferenceOverrideProperty
..}
= [(Key, Value)] -> Value
JSON.object
([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> SelfManagedConfigurationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SelfManagedConfiguration"
(SelfManagedConfigurationProperty -> (Key, Value))
-> Maybe SelfManagedConfigurationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SelfManagedConfigurationProperty
selfManagedConfiguration,
Key -> SemanticOverrideProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SemanticOverride" (SemanticOverrideProperty -> (Key, Value))
-> Maybe SemanticOverrideProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SemanticOverrideProperty
semanticOverride,
Key -> SummaryOverrideProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SummaryOverride" (SummaryOverrideProperty -> (Key, Value))
-> Maybe SummaryOverrideProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SummaryOverrideProperty
summaryOverride,
Key -> UserPreferenceOverrideProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"UserPreferenceOverride"
(UserPreferenceOverrideProperty -> (Key, Value))
-> Maybe UserPreferenceOverrideProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe UserPreferenceOverrideProperty
userPreferenceOverride]))
instance Property "SelfManagedConfiguration" CustomConfigurationInputProperty where
type PropertyType "SelfManagedConfiguration" CustomConfigurationInputProperty = SelfManagedConfigurationProperty
set :: PropertyType
"SelfManagedConfiguration" CustomConfigurationInputProperty
-> CustomConfigurationInputProperty
-> CustomConfigurationInputProperty
set PropertyType
"SelfManagedConfiguration" CustomConfigurationInputProperty
newValue CustomConfigurationInputProperty {Maybe SemanticOverrideProperty
Maybe SummaryOverrideProperty
Maybe SelfManagedConfigurationProperty
Maybe UserPreferenceOverrideProperty
()
haddock_workaround_ :: CustomConfigurationInputProperty -> ()
selfManagedConfiguration :: CustomConfigurationInputProperty
-> Maybe SelfManagedConfigurationProperty
semanticOverride :: CustomConfigurationInputProperty -> Maybe SemanticOverrideProperty
summaryOverride :: CustomConfigurationInputProperty -> Maybe SummaryOverrideProperty
userPreferenceOverride :: CustomConfigurationInputProperty
-> Maybe UserPreferenceOverrideProperty
haddock_workaround_ :: ()
selfManagedConfiguration :: Maybe SelfManagedConfigurationProperty
semanticOverride :: Maybe SemanticOverrideProperty
summaryOverride :: Maybe SummaryOverrideProperty
userPreferenceOverride :: Maybe UserPreferenceOverrideProperty
..}
= CustomConfigurationInputProperty
{selfManagedConfiguration :: Maybe SelfManagedConfigurationProperty
selfManagedConfiguration = SelfManagedConfigurationProperty
-> Maybe SelfManagedConfigurationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"SelfManagedConfiguration" CustomConfigurationInputProperty
SelfManagedConfigurationProperty
newValue, Maybe SemanticOverrideProperty
Maybe SummaryOverrideProperty
Maybe UserPreferenceOverrideProperty
()
haddock_workaround_ :: ()
semanticOverride :: Maybe SemanticOverrideProperty
summaryOverride :: Maybe SummaryOverrideProperty
userPreferenceOverride :: Maybe UserPreferenceOverrideProperty
haddock_workaround_ :: ()
semanticOverride :: Maybe SemanticOverrideProperty
summaryOverride :: Maybe SummaryOverrideProperty
userPreferenceOverride :: Maybe UserPreferenceOverrideProperty
..}
instance Property "SemanticOverride" CustomConfigurationInputProperty where
type PropertyType "SemanticOverride" CustomConfigurationInputProperty = SemanticOverrideProperty
set :: PropertyType "SemanticOverride" CustomConfigurationInputProperty
-> CustomConfigurationInputProperty
-> CustomConfigurationInputProperty
set PropertyType "SemanticOverride" CustomConfigurationInputProperty
newValue CustomConfigurationInputProperty {Maybe SemanticOverrideProperty
Maybe SummaryOverrideProperty
Maybe SelfManagedConfigurationProperty
Maybe UserPreferenceOverrideProperty
()
haddock_workaround_ :: CustomConfigurationInputProperty -> ()
selfManagedConfiguration :: CustomConfigurationInputProperty
-> Maybe SelfManagedConfigurationProperty
semanticOverride :: CustomConfigurationInputProperty -> Maybe SemanticOverrideProperty
summaryOverride :: CustomConfigurationInputProperty -> Maybe SummaryOverrideProperty
userPreferenceOverride :: CustomConfigurationInputProperty
-> Maybe UserPreferenceOverrideProperty
haddock_workaround_ :: ()
selfManagedConfiguration :: Maybe SelfManagedConfigurationProperty
semanticOverride :: Maybe SemanticOverrideProperty
summaryOverride :: Maybe SummaryOverrideProperty
userPreferenceOverride :: Maybe UserPreferenceOverrideProperty
..}
= CustomConfigurationInputProperty
{semanticOverride :: Maybe SemanticOverrideProperty
semanticOverride = SemanticOverrideProperty -> Maybe SemanticOverrideProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "SemanticOverride" CustomConfigurationInputProperty
SemanticOverrideProperty
newValue, Maybe SummaryOverrideProperty
Maybe SelfManagedConfigurationProperty
Maybe UserPreferenceOverrideProperty
()
haddock_workaround_ :: ()
selfManagedConfiguration :: Maybe SelfManagedConfigurationProperty
summaryOverride :: Maybe SummaryOverrideProperty
userPreferenceOverride :: Maybe UserPreferenceOverrideProperty
haddock_workaround_ :: ()
selfManagedConfiguration :: Maybe SelfManagedConfigurationProperty
summaryOverride :: Maybe SummaryOverrideProperty
userPreferenceOverride :: Maybe UserPreferenceOverrideProperty
..}
instance Property "SummaryOverride" CustomConfigurationInputProperty where
type PropertyType "SummaryOverride" CustomConfigurationInputProperty = SummaryOverrideProperty
set :: PropertyType "SummaryOverride" CustomConfigurationInputProperty
-> CustomConfigurationInputProperty
-> CustomConfigurationInputProperty
set PropertyType "SummaryOverride" CustomConfigurationInputProperty
newValue CustomConfigurationInputProperty {Maybe SemanticOverrideProperty
Maybe SummaryOverrideProperty
Maybe SelfManagedConfigurationProperty
Maybe UserPreferenceOverrideProperty
()
haddock_workaround_ :: CustomConfigurationInputProperty -> ()
selfManagedConfiguration :: CustomConfigurationInputProperty
-> Maybe SelfManagedConfigurationProperty
semanticOverride :: CustomConfigurationInputProperty -> Maybe SemanticOverrideProperty
summaryOverride :: CustomConfigurationInputProperty -> Maybe SummaryOverrideProperty
userPreferenceOverride :: CustomConfigurationInputProperty
-> Maybe UserPreferenceOverrideProperty
haddock_workaround_ :: ()
selfManagedConfiguration :: Maybe SelfManagedConfigurationProperty
semanticOverride :: Maybe SemanticOverrideProperty
summaryOverride :: Maybe SummaryOverrideProperty
userPreferenceOverride :: Maybe UserPreferenceOverrideProperty
..}
= CustomConfigurationInputProperty
{summaryOverride :: Maybe SummaryOverrideProperty
summaryOverride = SummaryOverrideProperty -> Maybe SummaryOverrideProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "SummaryOverride" CustomConfigurationInputProperty
SummaryOverrideProperty
newValue, Maybe SemanticOverrideProperty
Maybe SelfManagedConfigurationProperty
Maybe UserPreferenceOverrideProperty
()
haddock_workaround_ :: ()
selfManagedConfiguration :: Maybe SelfManagedConfigurationProperty
semanticOverride :: Maybe SemanticOverrideProperty
userPreferenceOverride :: Maybe UserPreferenceOverrideProperty
haddock_workaround_ :: ()
selfManagedConfiguration :: Maybe SelfManagedConfigurationProperty
semanticOverride :: Maybe SemanticOverrideProperty
userPreferenceOverride :: Maybe UserPreferenceOverrideProperty
..}
instance Property "UserPreferenceOverride" CustomConfigurationInputProperty where
type PropertyType "UserPreferenceOverride" CustomConfigurationInputProperty = UserPreferenceOverrideProperty
set :: PropertyType
"UserPreferenceOverride" CustomConfigurationInputProperty
-> CustomConfigurationInputProperty
-> CustomConfigurationInputProperty
set PropertyType
"UserPreferenceOverride" CustomConfigurationInputProperty
newValue CustomConfigurationInputProperty {Maybe SemanticOverrideProperty
Maybe SummaryOverrideProperty
Maybe SelfManagedConfigurationProperty
Maybe UserPreferenceOverrideProperty
()
haddock_workaround_ :: CustomConfigurationInputProperty -> ()
selfManagedConfiguration :: CustomConfigurationInputProperty
-> Maybe SelfManagedConfigurationProperty
semanticOverride :: CustomConfigurationInputProperty -> Maybe SemanticOverrideProperty
summaryOverride :: CustomConfigurationInputProperty -> Maybe SummaryOverrideProperty
userPreferenceOverride :: CustomConfigurationInputProperty
-> Maybe UserPreferenceOverrideProperty
haddock_workaround_ :: ()
selfManagedConfiguration :: Maybe SelfManagedConfigurationProperty
semanticOverride :: Maybe SemanticOverrideProperty
summaryOverride :: Maybe SummaryOverrideProperty
userPreferenceOverride :: Maybe UserPreferenceOverrideProperty
..}
= CustomConfigurationInputProperty
{userPreferenceOverride :: Maybe UserPreferenceOverrideProperty
userPreferenceOverride = UserPreferenceOverrideProperty
-> Maybe UserPreferenceOverrideProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"UserPreferenceOverride" CustomConfigurationInputProperty
UserPreferenceOverrideProperty
newValue, Maybe SemanticOverrideProperty
Maybe SummaryOverrideProperty
Maybe SelfManagedConfigurationProperty
()
haddock_workaround_ :: ()
selfManagedConfiguration :: Maybe SelfManagedConfigurationProperty
semanticOverride :: Maybe SemanticOverrideProperty
summaryOverride :: Maybe SummaryOverrideProperty
haddock_workaround_ :: ()
selfManagedConfiguration :: Maybe SelfManagedConfigurationProperty
semanticOverride :: Maybe SemanticOverrideProperty
summaryOverride :: Maybe SummaryOverrideProperty
..}