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