{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-binds #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}
module Amazonka.DMS.CreateReplicationSubnetGroup
(
CreateReplicationSubnetGroup (..),
newCreateReplicationSubnetGroup,
createReplicationSubnetGroup_tags,
createReplicationSubnetGroup_replicationSubnetGroupIdentifier,
createReplicationSubnetGroup_replicationSubnetGroupDescription,
createReplicationSubnetGroup_subnetIds,
CreateReplicationSubnetGroupResponse (..),
newCreateReplicationSubnetGroupResponse,
createReplicationSubnetGroupResponse_replicationSubnetGroup,
createReplicationSubnetGroupResponse_httpStatus,
)
where
import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import Amazonka.DMS.Types
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response
data CreateReplicationSubnetGroup = CreateReplicationSubnetGroup'
{
CreateReplicationSubnetGroup -> Maybe [Tag]
tags :: Prelude.Maybe [Tag],
CreateReplicationSubnetGroup -> Text
replicationSubnetGroupIdentifier :: Prelude.Text,
CreateReplicationSubnetGroup -> Text
replicationSubnetGroupDescription :: Prelude.Text,
CreateReplicationSubnetGroup -> [Text]
subnetIds :: [Prelude.Text]
}
deriving (CreateReplicationSubnetGroup
-> CreateReplicationSubnetGroup -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: CreateReplicationSubnetGroup
-> CreateReplicationSubnetGroup -> Bool
$c/= :: CreateReplicationSubnetGroup
-> CreateReplicationSubnetGroup -> Bool
== :: CreateReplicationSubnetGroup
-> CreateReplicationSubnetGroup -> Bool
$c== :: CreateReplicationSubnetGroup
-> CreateReplicationSubnetGroup -> Bool
Prelude.Eq, ReadPrec [CreateReplicationSubnetGroup]
ReadPrec CreateReplicationSubnetGroup
Int -> ReadS CreateReplicationSubnetGroup
ReadS [CreateReplicationSubnetGroup]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [CreateReplicationSubnetGroup]
$creadListPrec :: ReadPrec [CreateReplicationSubnetGroup]
readPrec :: ReadPrec CreateReplicationSubnetGroup
$creadPrec :: ReadPrec CreateReplicationSubnetGroup
readList :: ReadS [CreateReplicationSubnetGroup]
$creadList :: ReadS [CreateReplicationSubnetGroup]
readsPrec :: Int -> ReadS CreateReplicationSubnetGroup
$creadsPrec :: Int -> ReadS CreateReplicationSubnetGroup
Prelude.Read, Int -> CreateReplicationSubnetGroup -> ShowS
[CreateReplicationSubnetGroup] -> ShowS
CreateReplicationSubnetGroup -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [CreateReplicationSubnetGroup] -> ShowS
$cshowList :: [CreateReplicationSubnetGroup] -> ShowS
show :: CreateReplicationSubnetGroup -> String
$cshow :: CreateReplicationSubnetGroup -> String
showsPrec :: Int -> CreateReplicationSubnetGroup -> ShowS
$cshowsPrec :: Int -> CreateReplicationSubnetGroup -> ShowS
Prelude.Show, forall x.
Rep CreateReplicationSubnetGroup x -> CreateReplicationSubnetGroup
forall x.
CreateReplicationSubnetGroup -> Rep CreateReplicationSubnetGroup x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep CreateReplicationSubnetGroup x -> CreateReplicationSubnetGroup
$cfrom :: forall x.
CreateReplicationSubnetGroup -> Rep CreateReplicationSubnetGroup x
Prelude.Generic)
newCreateReplicationSubnetGroup ::
Prelude.Text ->
Prelude.Text ->
CreateReplicationSubnetGroup
newCreateReplicationSubnetGroup :: Text -> Text -> CreateReplicationSubnetGroup
newCreateReplicationSubnetGroup
Text
pReplicationSubnetGroupIdentifier_
Text
pReplicationSubnetGroupDescription_ =
CreateReplicationSubnetGroup'
{ $sel:tags:CreateReplicationSubnetGroup' :: Maybe [Tag]
tags =
forall a. Maybe a
Prelude.Nothing,
$sel:replicationSubnetGroupIdentifier:CreateReplicationSubnetGroup' :: Text
replicationSubnetGroupIdentifier =
Text
pReplicationSubnetGroupIdentifier_,
$sel:replicationSubnetGroupDescription:CreateReplicationSubnetGroup' :: Text
replicationSubnetGroupDescription =
Text
pReplicationSubnetGroupDescription_,
$sel:subnetIds:CreateReplicationSubnetGroup' :: [Text]
subnetIds = forall a. Monoid a => a
Prelude.mempty
}
createReplicationSubnetGroup_tags :: Lens.Lens' CreateReplicationSubnetGroup (Prelude.Maybe [Tag])
createReplicationSubnetGroup_tags :: Lens' CreateReplicationSubnetGroup (Maybe [Tag])
createReplicationSubnetGroup_tags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateReplicationSubnetGroup' {Maybe [Tag]
tags :: Maybe [Tag]
$sel:tags:CreateReplicationSubnetGroup' :: CreateReplicationSubnetGroup -> Maybe [Tag]
tags} -> Maybe [Tag]
tags) (\s :: CreateReplicationSubnetGroup
s@CreateReplicationSubnetGroup' {} Maybe [Tag]
a -> CreateReplicationSubnetGroup
s {$sel:tags:CreateReplicationSubnetGroup' :: Maybe [Tag]
tags = Maybe [Tag]
a} :: CreateReplicationSubnetGroup) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced
createReplicationSubnetGroup_replicationSubnetGroupIdentifier :: Lens.Lens' CreateReplicationSubnetGroup Prelude.Text
createReplicationSubnetGroup_replicationSubnetGroupIdentifier :: Lens' CreateReplicationSubnetGroup Text
createReplicationSubnetGroup_replicationSubnetGroupIdentifier = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateReplicationSubnetGroup' {Text
replicationSubnetGroupIdentifier :: Text
$sel:replicationSubnetGroupIdentifier:CreateReplicationSubnetGroup' :: CreateReplicationSubnetGroup -> Text
replicationSubnetGroupIdentifier} -> Text
replicationSubnetGroupIdentifier) (\s :: CreateReplicationSubnetGroup
s@CreateReplicationSubnetGroup' {} Text
a -> CreateReplicationSubnetGroup
s {$sel:replicationSubnetGroupIdentifier:CreateReplicationSubnetGroup' :: Text
replicationSubnetGroupIdentifier = Text
a} :: CreateReplicationSubnetGroup)
createReplicationSubnetGroup_replicationSubnetGroupDescription :: Lens.Lens' CreateReplicationSubnetGroup Prelude.Text
createReplicationSubnetGroup_replicationSubnetGroupDescription :: Lens' CreateReplicationSubnetGroup Text
createReplicationSubnetGroup_replicationSubnetGroupDescription = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateReplicationSubnetGroup' {Text
replicationSubnetGroupDescription :: Text
$sel:replicationSubnetGroupDescription:CreateReplicationSubnetGroup' :: CreateReplicationSubnetGroup -> Text
replicationSubnetGroupDescription} -> Text
replicationSubnetGroupDescription) (\s :: CreateReplicationSubnetGroup
s@CreateReplicationSubnetGroup' {} Text
a -> CreateReplicationSubnetGroup
s {$sel:replicationSubnetGroupDescription:CreateReplicationSubnetGroup' :: Text
replicationSubnetGroupDescription = Text
a} :: CreateReplicationSubnetGroup)
createReplicationSubnetGroup_subnetIds :: Lens.Lens' CreateReplicationSubnetGroup [Prelude.Text]
createReplicationSubnetGroup_subnetIds :: Lens' CreateReplicationSubnetGroup [Text]
createReplicationSubnetGroup_subnetIds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateReplicationSubnetGroup' {[Text]
subnetIds :: [Text]
$sel:subnetIds:CreateReplicationSubnetGroup' :: CreateReplicationSubnetGroup -> [Text]
subnetIds} -> [Text]
subnetIds) (\s :: CreateReplicationSubnetGroup
s@CreateReplicationSubnetGroup' {} [Text]
a -> CreateReplicationSubnetGroup
s {$sel:subnetIds:CreateReplicationSubnetGroup' :: [Text]
subnetIds = [Text]
a} :: CreateReplicationSubnetGroup) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced
instance Core.AWSRequest CreateReplicationSubnetGroup where
type
AWSResponse CreateReplicationSubnetGroup =
CreateReplicationSubnetGroupResponse
request :: (Service -> Service)
-> CreateReplicationSubnetGroup
-> Request CreateReplicationSubnetGroup
request Service -> Service
overrides =
forall a. (ToRequest a, ToJSON a) => Service -> a -> Request a
Request.postJSON (Service -> Service
overrides Service
defaultService)
response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy CreateReplicationSubnetGroup
-> ClientResponse ClientBody
-> m (Either
Error (ClientResponse (AWSResponse CreateReplicationSubnetGroup)))
response =
forall (m :: * -> *) a.
MonadResource m =>
(Int -> ResponseHeaders -> Object -> Either String (AWSResponse a))
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveJSON
( \Int
s ResponseHeaders
h Object
x ->
Maybe ReplicationSubnetGroup
-> Int -> CreateReplicationSubnetGroupResponse
CreateReplicationSubnetGroupResponse'
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"ReplicationSubnetGroup")
forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure (forall a. Enum a => a -> Int
Prelude.fromEnum Int
s))
)
instance
Prelude.Hashable
CreateReplicationSubnetGroup
where
hashWithSalt :: Int -> CreateReplicationSubnetGroup -> Int
hashWithSalt Int
_salt CreateReplicationSubnetGroup' {[Text]
Maybe [Tag]
Text
subnetIds :: [Text]
replicationSubnetGroupDescription :: Text
replicationSubnetGroupIdentifier :: Text
tags :: Maybe [Tag]
$sel:subnetIds:CreateReplicationSubnetGroup' :: CreateReplicationSubnetGroup -> [Text]
$sel:replicationSubnetGroupDescription:CreateReplicationSubnetGroup' :: CreateReplicationSubnetGroup -> Text
$sel:replicationSubnetGroupIdentifier:CreateReplicationSubnetGroup' :: CreateReplicationSubnetGroup -> Text
$sel:tags:CreateReplicationSubnetGroup' :: CreateReplicationSubnetGroup -> Maybe [Tag]
..} =
Int
_salt
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Tag]
tags
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
replicationSubnetGroupIdentifier
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
replicationSubnetGroupDescription
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` [Text]
subnetIds
instance Prelude.NFData CreateReplicationSubnetGroup where
rnf :: CreateReplicationSubnetGroup -> ()
rnf CreateReplicationSubnetGroup' {[Text]
Maybe [Tag]
Text
subnetIds :: [Text]
replicationSubnetGroupDescription :: Text
replicationSubnetGroupIdentifier :: Text
tags :: Maybe [Tag]
$sel:subnetIds:CreateReplicationSubnetGroup' :: CreateReplicationSubnetGroup -> [Text]
$sel:replicationSubnetGroupDescription:CreateReplicationSubnetGroup' :: CreateReplicationSubnetGroup -> Text
$sel:replicationSubnetGroupIdentifier:CreateReplicationSubnetGroup' :: CreateReplicationSubnetGroup -> Text
$sel:tags:CreateReplicationSubnetGroup' :: CreateReplicationSubnetGroup -> Maybe [Tag]
..} =
forall a. NFData a => a -> ()
Prelude.rnf Maybe [Tag]
tags
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
replicationSubnetGroupIdentifier
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
replicationSubnetGroupDescription
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf [Text]
subnetIds
instance Data.ToHeaders CreateReplicationSubnetGroup where
toHeaders :: CreateReplicationSubnetGroup -> ResponseHeaders
toHeaders =
forall a b. a -> b -> a
Prelude.const
( forall a. Monoid a => [a] -> a
Prelude.mconcat
[ HeaderName
"X-Amz-Target"
forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"AmazonDMSv20160101.CreateReplicationSubnetGroup" ::
Prelude.ByteString
),
HeaderName
"Content-Type"
forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"application/x-amz-json-1.1" ::
Prelude.ByteString
)
]
)
instance Data.ToJSON CreateReplicationSubnetGroup where
toJSON :: CreateReplicationSubnetGroup -> Value
toJSON CreateReplicationSubnetGroup' {[Text]
Maybe [Tag]
Text
subnetIds :: [Text]
replicationSubnetGroupDescription :: Text
replicationSubnetGroupIdentifier :: Text
tags :: Maybe [Tag]
$sel:subnetIds:CreateReplicationSubnetGroup' :: CreateReplicationSubnetGroup -> [Text]
$sel:replicationSubnetGroupDescription:CreateReplicationSubnetGroup' :: CreateReplicationSubnetGroup -> Text
$sel:replicationSubnetGroupIdentifier:CreateReplicationSubnetGroup' :: CreateReplicationSubnetGroup -> Text
$sel:tags:CreateReplicationSubnetGroup' :: CreateReplicationSubnetGroup -> Maybe [Tag]
..} =
[Pair] -> Value
Data.object
( forall a. [Maybe a] -> [a]
Prelude.catMaybes
[ (Key
"Tags" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags,
forall a. a -> Maybe a
Prelude.Just
( Key
"ReplicationSubnetGroupIdentifier"
forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
replicationSubnetGroupIdentifier
),
forall a. a -> Maybe a
Prelude.Just
( Key
"ReplicationSubnetGroupDescription"
forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
replicationSubnetGroupDescription
),
forall a. a -> Maybe a
Prelude.Just (Key
"SubnetIds" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= [Text]
subnetIds)
]
)
instance Data.ToPath CreateReplicationSubnetGroup where
toPath :: CreateReplicationSubnetGroup -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/"
instance Data.ToQuery CreateReplicationSubnetGroup where
toQuery :: CreateReplicationSubnetGroup -> QueryString
toQuery = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty
data CreateReplicationSubnetGroupResponse = CreateReplicationSubnetGroupResponse'
{
CreateReplicationSubnetGroupResponse
-> Maybe ReplicationSubnetGroup
replicationSubnetGroup :: Prelude.Maybe ReplicationSubnetGroup,
CreateReplicationSubnetGroupResponse -> Int
httpStatus :: Prelude.Int
}
deriving (CreateReplicationSubnetGroupResponse
-> CreateReplicationSubnetGroupResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: CreateReplicationSubnetGroupResponse
-> CreateReplicationSubnetGroupResponse -> Bool
$c/= :: CreateReplicationSubnetGroupResponse
-> CreateReplicationSubnetGroupResponse -> Bool
== :: CreateReplicationSubnetGroupResponse
-> CreateReplicationSubnetGroupResponse -> Bool
$c== :: CreateReplicationSubnetGroupResponse
-> CreateReplicationSubnetGroupResponse -> Bool
Prelude.Eq, ReadPrec [CreateReplicationSubnetGroupResponse]
ReadPrec CreateReplicationSubnetGroupResponse
Int -> ReadS CreateReplicationSubnetGroupResponse
ReadS [CreateReplicationSubnetGroupResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [CreateReplicationSubnetGroupResponse]
$creadListPrec :: ReadPrec [CreateReplicationSubnetGroupResponse]
readPrec :: ReadPrec CreateReplicationSubnetGroupResponse
$creadPrec :: ReadPrec CreateReplicationSubnetGroupResponse
readList :: ReadS [CreateReplicationSubnetGroupResponse]
$creadList :: ReadS [CreateReplicationSubnetGroupResponse]
readsPrec :: Int -> ReadS CreateReplicationSubnetGroupResponse
$creadsPrec :: Int -> ReadS CreateReplicationSubnetGroupResponse
Prelude.Read, Int -> CreateReplicationSubnetGroupResponse -> ShowS
[CreateReplicationSubnetGroupResponse] -> ShowS
CreateReplicationSubnetGroupResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [CreateReplicationSubnetGroupResponse] -> ShowS
$cshowList :: [CreateReplicationSubnetGroupResponse] -> ShowS
show :: CreateReplicationSubnetGroupResponse -> String
$cshow :: CreateReplicationSubnetGroupResponse -> String
showsPrec :: Int -> CreateReplicationSubnetGroupResponse -> ShowS
$cshowsPrec :: Int -> CreateReplicationSubnetGroupResponse -> ShowS
Prelude.Show, forall x.
Rep CreateReplicationSubnetGroupResponse x
-> CreateReplicationSubnetGroupResponse
forall x.
CreateReplicationSubnetGroupResponse
-> Rep CreateReplicationSubnetGroupResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep CreateReplicationSubnetGroupResponse x
-> CreateReplicationSubnetGroupResponse
$cfrom :: forall x.
CreateReplicationSubnetGroupResponse
-> Rep CreateReplicationSubnetGroupResponse x
Prelude.Generic)
newCreateReplicationSubnetGroupResponse ::
Prelude.Int ->
CreateReplicationSubnetGroupResponse
newCreateReplicationSubnetGroupResponse :: Int -> CreateReplicationSubnetGroupResponse
newCreateReplicationSubnetGroupResponse Int
pHttpStatus_ =
CreateReplicationSubnetGroupResponse'
{ $sel:replicationSubnetGroup:CreateReplicationSubnetGroupResponse' :: Maybe ReplicationSubnetGroup
replicationSubnetGroup =
forall a. Maybe a
Prelude.Nothing,
$sel:httpStatus:CreateReplicationSubnetGroupResponse' :: Int
httpStatus = Int
pHttpStatus_
}
createReplicationSubnetGroupResponse_replicationSubnetGroup :: Lens.Lens' CreateReplicationSubnetGroupResponse (Prelude.Maybe ReplicationSubnetGroup)
createReplicationSubnetGroupResponse_replicationSubnetGroup :: Lens'
CreateReplicationSubnetGroupResponse (Maybe ReplicationSubnetGroup)
createReplicationSubnetGroupResponse_replicationSubnetGroup = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateReplicationSubnetGroupResponse' {Maybe ReplicationSubnetGroup
replicationSubnetGroup :: Maybe ReplicationSubnetGroup
$sel:replicationSubnetGroup:CreateReplicationSubnetGroupResponse' :: CreateReplicationSubnetGroupResponse
-> Maybe ReplicationSubnetGroup
replicationSubnetGroup} -> Maybe ReplicationSubnetGroup
replicationSubnetGroup) (\s :: CreateReplicationSubnetGroupResponse
s@CreateReplicationSubnetGroupResponse' {} Maybe ReplicationSubnetGroup
a -> CreateReplicationSubnetGroupResponse
s {$sel:replicationSubnetGroup:CreateReplicationSubnetGroupResponse' :: Maybe ReplicationSubnetGroup
replicationSubnetGroup = Maybe ReplicationSubnetGroup
a} :: CreateReplicationSubnetGroupResponse)
createReplicationSubnetGroupResponse_httpStatus :: Lens.Lens' CreateReplicationSubnetGroupResponse Prelude.Int
createReplicationSubnetGroupResponse_httpStatus :: Lens' CreateReplicationSubnetGroupResponse Int
createReplicationSubnetGroupResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\CreateReplicationSubnetGroupResponse' {Int
httpStatus :: Int
$sel:httpStatus:CreateReplicationSubnetGroupResponse' :: CreateReplicationSubnetGroupResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: CreateReplicationSubnetGroupResponse
s@CreateReplicationSubnetGroupResponse' {} Int
a -> CreateReplicationSubnetGroupResponse
s {$sel:httpStatus:CreateReplicationSubnetGroupResponse' :: Int
httpStatus = Int
a} :: CreateReplicationSubnetGroupResponse)
instance
Prelude.NFData
CreateReplicationSubnetGroupResponse
where
rnf :: CreateReplicationSubnetGroupResponse -> ()
rnf CreateReplicationSubnetGroupResponse' {Int
Maybe ReplicationSubnetGroup
httpStatus :: Int
replicationSubnetGroup :: Maybe ReplicationSubnetGroup
$sel:httpStatus:CreateReplicationSubnetGroupResponse' :: CreateReplicationSubnetGroupResponse -> Int
$sel:replicationSubnetGroup:CreateReplicationSubnetGroupResponse' :: CreateReplicationSubnetGroupResponse
-> Maybe ReplicationSubnetGroup
..} =
forall a. NFData a => a -> ()
Prelude.rnf Maybe ReplicationSubnetGroup
replicationSubnetGroup
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus