module Stratosphere.FSx.S3AccessPointAttachment.S3AccessPointOpenZFSConfigurationProperty (
module Exports, S3AccessPointOpenZFSConfigurationProperty(..),
mkS3AccessPointOpenZFSConfigurationProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.FSx.S3AccessPointAttachment.OpenZFSFileSystemIdentityProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data S3AccessPointOpenZFSConfigurationProperty
=
S3AccessPointOpenZFSConfigurationProperty {S3AccessPointOpenZFSConfigurationProperty -> ()
haddock_workaround_ :: (),
S3AccessPointOpenZFSConfigurationProperty
-> OpenZFSFileSystemIdentityProperty
fileSystemIdentity :: OpenZFSFileSystemIdentityProperty,
S3AccessPointOpenZFSConfigurationProperty -> Value Text
volumeId :: (Value Prelude.Text)}
deriving stock (S3AccessPointOpenZFSConfigurationProperty
-> S3AccessPointOpenZFSConfigurationProperty -> Bool
(S3AccessPointOpenZFSConfigurationProperty
-> S3AccessPointOpenZFSConfigurationProperty -> Bool)
-> (S3AccessPointOpenZFSConfigurationProperty
-> S3AccessPointOpenZFSConfigurationProperty -> Bool)
-> Eq S3AccessPointOpenZFSConfigurationProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: S3AccessPointOpenZFSConfigurationProperty
-> S3AccessPointOpenZFSConfigurationProperty -> Bool
== :: S3AccessPointOpenZFSConfigurationProperty
-> S3AccessPointOpenZFSConfigurationProperty -> Bool
$c/= :: S3AccessPointOpenZFSConfigurationProperty
-> S3AccessPointOpenZFSConfigurationProperty -> Bool
/= :: S3AccessPointOpenZFSConfigurationProperty
-> S3AccessPointOpenZFSConfigurationProperty -> Bool
Prelude.Eq, Int -> S3AccessPointOpenZFSConfigurationProperty -> ShowS
[S3AccessPointOpenZFSConfigurationProperty] -> ShowS
S3AccessPointOpenZFSConfigurationProperty -> String
(Int -> S3AccessPointOpenZFSConfigurationProperty -> ShowS)
-> (S3AccessPointOpenZFSConfigurationProperty -> String)
-> ([S3AccessPointOpenZFSConfigurationProperty] -> ShowS)
-> Show S3AccessPointOpenZFSConfigurationProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> S3AccessPointOpenZFSConfigurationProperty -> ShowS
showsPrec :: Int -> S3AccessPointOpenZFSConfigurationProperty -> ShowS
$cshow :: S3AccessPointOpenZFSConfigurationProperty -> String
show :: S3AccessPointOpenZFSConfigurationProperty -> String
$cshowList :: [S3AccessPointOpenZFSConfigurationProperty] -> ShowS
showList :: [S3AccessPointOpenZFSConfigurationProperty] -> ShowS
Prelude.Show)
mkS3AccessPointOpenZFSConfigurationProperty ::
OpenZFSFileSystemIdentityProperty
-> Value Prelude.Text -> S3AccessPointOpenZFSConfigurationProperty
mkS3AccessPointOpenZFSConfigurationProperty :: OpenZFSFileSystemIdentityProperty
-> Value Text -> S3AccessPointOpenZFSConfigurationProperty
mkS3AccessPointOpenZFSConfigurationProperty
OpenZFSFileSystemIdentityProperty
fileSystemIdentity
Value Text
volumeId
= S3AccessPointOpenZFSConfigurationProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), fileSystemIdentity :: OpenZFSFileSystemIdentityProperty
fileSystemIdentity = OpenZFSFileSystemIdentityProperty
fileSystemIdentity,
volumeId :: Value Text
volumeId = Value Text
volumeId}
instance ToResourceProperties S3AccessPointOpenZFSConfigurationProperty where
toResourceProperties :: S3AccessPointOpenZFSConfigurationProperty -> ResourceProperties
toResourceProperties S3AccessPointOpenZFSConfigurationProperty {()
Value Text
OpenZFSFileSystemIdentityProperty
haddock_workaround_ :: S3AccessPointOpenZFSConfigurationProperty -> ()
fileSystemIdentity :: S3AccessPointOpenZFSConfigurationProperty
-> OpenZFSFileSystemIdentityProperty
volumeId :: S3AccessPointOpenZFSConfigurationProperty -> Value Text
haddock_workaround_ :: ()
fileSystemIdentity :: OpenZFSFileSystemIdentityProperty
volumeId :: Value Text
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::FSx::S3AccessPointAttachment.S3AccessPointOpenZFSConfiguration",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Key
"FileSystemIdentity" Key -> OpenZFSFileSystemIdentityProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= OpenZFSFileSystemIdentityProperty
fileSystemIdentity,
Key
"VolumeId" 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
volumeId]}
instance JSON.ToJSON S3AccessPointOpenZFSConfigurationProperty where
toJSON :: S3AccessPointOpenZFSConfigurationProperty -> Value
toJSON S3AccessPointOpenZFSConfigurationProperty {()
Value Text
OpenZFSFileSystemIdentityProperty
haddock_workaround_ :: S3AccessPointOpenZFSConfigurationProperty -> ()
fileSystemIdentity :: S3AccessPointOpenZFSConfigurationProperty
-> OpenZFSFileSystemIdentityProperty
volumeId :: S3AccessPointOpenZFSConfigurationProperty -> Value Text
haddock_workaround_ :: ()
fileSystemIdentity :: OpenZFSFileSystemIdentityProperty
volumeId :: Value Text
..}
= [(Key, Value)] -> Value
JSON.object
[Key
"FileSystemIdentity" Key -> OpenZFSFileSystemIdentityProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= OpenZFSFileSystemIdentityProperty
fileSystemIdentity,
Key
"VolumeId" 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
volumeId]
instance Property "FileSystemIdentity" S3AccessPointOpenZFSConfigurationProperty where
type PropertyType "FileSystemIdentity" S3AccessPointOpenZFSConfigurationProperty = OpenZFSFileSystemIdentityProperty
set :: PropertyType
"FileSystemIdentity" S3AccessPointOpenZFSConfigurationProperty
-> S3AccessPointOpenZFSConfigurationProperty
-> S3AccessPointOpenZFSConfigurationProperty
set PropertyType
"FileSystemIdentity" S3AccessPointOpenZFSConfigurationProperty
newValue S3AccessPointOpenZFSConfigurationProperty {()
Value Text
OpenZFSFileSystemIdentityProperty
haddock_workaround_ :: S3AccessPointOpenZFSConfigurationProperty -> ()
fileSystemIdentity :: S3AccessPointOpenZFSConfigurationProperty
-> OpenZFSFileSystemIdentityProperty
volumeId :: S3AccessPointOpenZFSConfigurationProperty -> Value Text
haddock_workaround_ :: ()
fileSystemIdentity :: OpenZFSFileSystemIdentityProperty
volumeId :: Value Text
..}
= S3AccessPointOpenZFSConfigurationProperty
{fileSystemIdentity :: OpenZFSFileSystemIdentityProperty
fileSystemIdentity = PropertyType
"FileSystemIdentity" S3AccessPointOpenZFSConfigurationProperty
OpenZFSFileSystemIdentityProperty
newValue, ()
Value Text
haddock_workaround_ :: ()
volumeId :: Value Text
haddock_workaround_ :: ()
volumeId :: Value Text
..}
instance Property "VolumeId" S3AccessPointOpenZFSConfigurationProperty where
type PropertyType "VolumeId" S3AccessPointOpenZFSConfigurationProperty = Value Prelude.Text
set :: PropertyType "VolumeId" S3AccessPointOpenZFSConfigurationProperty
-> S3AccessPointOpenZFSConfigurationProperty
-> S3AccessPointOpenZFSConfigurationProperty
set PropertyType "VolumeId" S3AccessPointOpenZFSConfigurationProperty
newValue S3AccessPointOpenZFSConfigurationProperty {()
Value Text
OpenZFSFileSystemIdentityProperty
haddock_workaround_ :: S3AccessPointOpenZFSConfigurationProperty -> ()
fileSystemIdentity :: S3AccessPointOpenZFSConfigurationProperty
-> OpenZFSFileSystemIdentityProperty
volumeId :: S3AccessPointOpenZFSConfigurationProperty -> Value Text
haddock_workaround_ :: ()
fileSystemIdentity :: OpenZFSFileSystemIdentityProperty
volumeId :: Value Text
..}
= S3AccessPointOpenZFSConfigurationProperty
{volumeId :: Value Text
volumeId = PropertyType "VolumeId" S3AccessPointOpenZFSConfigurationProperty
Value Text
newValue, ()
OpenZFSFileSystemIdentityProperty
haddock_workaround_ :: ()
fileSystemIdentity :: OpenZFSFileSystemIdentityProperty
haddock_workaround_ :: ()
fileSystemIdentity :: OpenZFSFileSystemIdentityProperty
..}