{-# 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 #-}

-- Derived from AWS service descriptions, licensed under Apache 2.0.

-- |
-- Module      : Amazonka.EC2.DeleteTransitGatewayMulticastDomain
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Deletes the specified transit gateway multicast domain.
module Amazonka.EC2.DeleteTransitGatewayMulticastDomain
  ( -- * Creating a Request
    DeleteTransitGatewayMulticastDomain (..),
    newDeleteTransitGatewayMulticastDomain,

    -- * Request Lenses
    deleteTransitGatewayMulticastDomain_dryRun,
    deleteTransitGatewayMulticastDomain_transitGatewayMulticastDomainId,

    -- * Destructuring the Response
    DeleteTransitGatewayMulticastDomainResponse (..),
    newDeleteTransitGatewayMulticastDomainResponse,

    -- * Response Lenses
    deleteTransitGatewayMulticastDomainResponse_transitGatewayMulticastDomain,
    deleteTransitGatewayMulticastDomainResponse_httpStatus,
  )
where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.EC2.Types
import qualified Amazonka.Prelude as Prelude
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response

-- | /See:/ 'newDeleteTransitGatewayMulticastDomain' smart constructor.
data DeleteTransitGatewayMulticastDomain = DeleteTransitGatewayMulticastDomain'
  { -- | Checks whether you have the required permissions for the action, without
    -- actually making the request, and provides an error response. If you have
    -- the required permissions, the error response is @DryRunOperation@.
    -- Otherwise, it is @UnauthorizedOperation@.
    DeleteTransitGatewayMulticastDomain -> Maybe Bool
dryRun :: Prelude.Maybe Prelude.Bool,
    -- | The ID of the transit gateway multicast domain.
    DeleteTransitGatewayMulticastDomain -> Text
transitGatewayMulticastDomainId :: Prelude.Text
  }
  deriving (DeleteTransitGatewayMulticastDomain
-> DeleteTransitGatewayMulticastDomain -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DeleteTransitGatewayMulticastDomain
-> DeleteTransitGatewayMulticastDomain -> Bool
$c/= :: DeleteTransitGatewayMulticastDomain
-> DeleteTransitGatewayMulticastDomain -> Bool
== :: DeleteTransitGatewayMulticastDomain
-> DeleteTransitGatewayMulticastDomain -> Bool
$c== :: DeleteTransitGatewayMulticastDomain
-> DeleteTransitGatewayMulticastDomain -> Bool
Prelude.Eq, ReadPrec [DeleteTransitGatewayMulticastDomain]
ReadPrec DeleteTransitGatewayMulticastDomain
Int -> ReadS DeleteTransitGatewayMulticastDomain
ReadS [DeleteTransitGatewayMulticastDomain]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DeleteTransitGatewayMulticastDomain]
$creadListPrec :: ReadPrec [DeleteTransitGatewayMulticastDomain]
readPrec :: ReadPrec DeleteTransitGatewayMulticastDomain
$creadPrec :: ReadPrec DeleteTransitGatewayMulticastDomain
readList :: ReadS [DeleteTransitGatewayMulticastDomain]
$creadList :: ReadS [DeleteTransitGatewayMulticastDomain]
readsPrec :: Int -> ReadS DeleteTransitGatewayMulticastDomain
$creadsPrec :: Int -> ReadS DeleteTransitGatewayMulticastDomain
Prelude.Read, Int -> DeleteTransitGatewayMulticastDomain -> ShowS
[DeleteTransitGatewayMulticastDomain] -> ShowS
DeleteTransitGatewayMulticastDomain -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DeleteTransitGatewayMulticastDomain] -> ShowS
$cshowList :: [DeleteTransitGatewayMulticastDomain] -> ShowS
show :: DeleteTransitGatewayMulticastDomain -> String
$cshow :: DeleteTransitGatewayMulticastDomain -> String
showsPrec :: Int -> DeleteTransitGatewayMulticastDomain -> ShowS
$cshowsPrec :: Int -> DeleteTransitGatewayMulticastDomain -> ShowS
Prelude.Show, forall x.
Rep DeleteTransitGatewayMulticastDomain x
-> DeleteTransitGatewayMulticastDomain
forall x.
DeleteTransitGatewayMulticastDomain
-> Rep DeleteTransitGatewayMulticastDomain x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DeleteTransitGatewayMulticastDomain x
-> DeleteTransitGatewayMulticastDomain
$cfrom :: forall x.
DeleteTransitGatewayMulticastDomain
-> Rep DeleteTransitGatewayMulticastDomain x
Prelude.Generic)

-- |
-- Create a value of 'DeleteTransitGatewayMulticastDomain' with all optional fields omitted.
--
-- Use <https://hackage.haskell.org/package/generic-lens generic-lens> or <https://hackage.haskell.org/package/optics optics> to modify other optional fields.
--
-- The following record fields are available, with the corresponding lenses provided
-- for backwards compatibility:
--
-- 'dryRun', 'deleteTransitGatewayMulticastDomain_dryRun' - Checks whether you have the required permissions for the action, without
-- actually making the request, and provides an error response. If you have
-- the required permissions, the error response is @DryRunOperation@.
-- Otherwise, it is @UnauthorizedOperation@.
--
-- 'transitGatewayMulticastDomainId', 'deleteTransitGatewayMulticastDomain_transitGatewayMulticastDomainId' - The ID of the transit gateway multicast domain.
newDeleteTransitGatewayMulticastDomain ::
  -- | 'transitGatewayMulticastDomainId'
  Prelude.Text ->
  DeleteTransitGatewayMulticastDomain
newDeleteTransitGatewayMulticastDomain :: Text -> DeleteTransitGatewayMulticastDomain
newDeleteTransitGatewayMulticastDomain
  Text
pTransitGatewayMulticastDomainId_ =
    DeleteTransitGatewayMulticastDomain'
      { $sel:dryRun:DeleteTransitGatewayMulticastDomain' :: Maybe Bool
dryRun =
          forall a. Maybe a
Prelude.Nothing,
        $sel:transitGatewayMulticastDomainId:DeleteTransitGatewayMulticastDomain' :: Text
transitGatewayMulticastDomainId =
          Text
pTransitGatewayMulticastDomainId_
      }

-- | Checks whether you have the required permissions for the action, without
-- actually making the request, and provides an error response. If you have
-- the required permissions, the error response is @DryRunOperation@.
-- Otherwise, it is @UnauthorizedOperation@.
deleteTransitGatewayMulticastDomain_dryRun :: Lens.Lens' DeleteTransitGatewayMulticastDomain (Prelude.Maybe Prelude.Bool)
deleteTransitGatewayMulticastDomain_dryRun :: Lens' DeleteTransitGatewayMulticastDomain (Maybe Bool)
deleteTransitGatewayMulticastDomain_dryRun = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeleteTransitGatewayMulticastDomain' {Maybe Bool
dryRun :: Maybe Bool
$sel:dryRun:DeleteTransitGatewayMulticastDomain' :: DeleteTransitGatewayMulticastDomain -> Maybe Bool
dryRun} -> Maybe Bool
dryRun) (\s :: DeleteTransitGatewayMulticastDomain
s@DeleteTransitGatewayMulticastDomain' {} Maybe Bool
a -> DeleteTransitGatewayMulticastDomain
s {$sel:dryRun:DeleteTransitGatewayMulticastDomain' :: Maybe Bool
dryRun = Maybe Bool
a} :: DeleteTransitGatewayMulticastDomain)

-- | The ID of the transit gateway multicast domain.
deleteTransitGatewayMulticastDomain_transitGatewayMulticastDomainId :: Lens.Lens' DeleteTransitGatewayMulticastDomain Prelude.Text
deleteTransitGatewayMulticastDomain_transitGatewayMulticastDomainId :: Lens' DeleteTransitGatewayMulticastDomain Text
deleteTransitGatewayMulticastDomain_transitGatewayMulticastDomainId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeleteTransitGatewayMulticastDomain' {Text
transitGatewayMulticastDomainId :: Text
$sel:transitGatewayMulticastDomainId:DeleteTransitGatewayMulticastDomain' :: DeleteTransitGatewayMulticastDomain -> Text
transitGatewayMulticastDomainId} -> Text
transitGatewayMulticastDomainId) (\s :: DeleteTransitGatewayMulticastDomain
s@DeleteTransitGatewayMulticastDomain' {} Text
a -> DeleteTransitGatewayMulticastDomain
s {$sel:transitGatewayMulticastDomainId:DeleteTransitGatewayMulticastDomain' :: Text
transitGatewayMulticastDomainId = Text
a} :: DeleteTransitGatewayMulticastDomain)

instance
  Core.AWSRequest
    DeleteTransitGatewayMulticastDomain
  where
  type
    AWSResponse DeleteTransitGatewayMulticastDomain =
      DeleteTransitGatewayMulticastDomainResponse
  request :: (Service -> Service)
-> DeleteTransitGatewayMulticastDomain
-> Request DeleteTransitGatewayMulticastDomain
request Service -> Service
overrides =
    forall a. ToRequest a => Service -> a -> Request a
Request.postQuery (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy DeleteTransitGatewayMulticastDomain
-> ClientResponse ClientBody
-> m (Either
        Error
        (ClientResponse (AWSResponse DeleteTransitGatewayMulticastDomain)))
response =
    forall (m :: * -> *) a.
MonadResource m =>
(Int -> ResponseHeaders -> [Node] -> Either String (AWSResponse a))
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveXML
      ( \Int
s ResponseHeaders
h [Node]
x ->
          Maybe TransitGatewayMulticastDomain
-> Int -> DeleteTransitGatewayMulticastDomainResponse
DeleteTransitGatewayMulticastDomainResponse'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> ([Node]
x forall a. FromXML a => [Node] -> Text -> Either String (Maybe a)
Data..@? Text
"transitGatewayMulticastDomain")
            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
    DeleteTransitGatewayMulticastDomain
  where
  hashWithSalt :: Int -> DeleteTransitGatewayMulticastDomain -> Int
hashWithSalt
    Int
_salt
    DeleteTransitGatewayMulticastDomain' {Maybe Bool
Text
transitGatewayMulticastDomainId :: Text
dryRun :: Maybe Bool
$sel:transitGatewayMulticastDomainId:DeleteTransitGatewayMulticastDomain' :: DeleteTransitGatewayMulticastDomain -> Text
$sel:dryRun:DeleteTransitGatewayMulticastDomain' :: DeleteTransitGatewayMulticastDomain -> Maybe Bool
..} =
      Int
_salt
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
dryRun
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
transitGatewayMulticastDomainId

instance
  Prelude.NFData
    DeleteTransitGatewayMulticastDomain
  where
  rnf :: DeleteTransitGatewayMulticastDomain -> ()
rnf DeleteTransitGatewayMulticastDomain' {Maybe Bool
Text
transitGatewayMulticastDomainId :: Text
dryRun :: Maybe Bool
$sel:transitGatewayMulticastDomainId:DeleteTransitGatewayMulticastDomain' :: DeleteTransitGatewayMulticastDomain -> Text
$sel:dryRun:DeleteTransitGatewayMulticastDomain' :: DeleteTransitGatewayMulticastDomain -> Maybe Bool
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
dryRun
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
transitGatewayMulticastDomainId

instance
  Data.ToHeaders
    DeleteTransitGatewayMulticastDomain
  where
  toHeaders :: DeleteTransitGatewayMulticastDomain -> ResponseHeaders
toHeaders = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty

instance
  Data.ToPath
    DeleteTransitGatewayMulticastDomain
  where
  toPath :: DeleteTransitGatewayMulticastDomain -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/"

instance
  Data.ToQuery
    DeleteTransitGatewayMulticastDomain
  where
  toQuery :: DeleteTransitGatewayMulticastDomain -> QueryString
toQuery DeleteTransitGatewayMulticastDomain' {Maybe Bool
Text
transitGatewayMulticastDomainId :: Text
dryRun :: Maybe Bool
$sel:transitGatewayMulticastDomainId:DeleteTransitGatewayMulticastDomain' :: DeleteTransitGatewayMulticastDomain -> Text
$sel:dryRun:DeleteTransitGatewayMulticastDomain' :: DeleteTransitGatewayMulticastDomain -> Maybe Bool
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"Action"
          forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: ( ByteString
"DeleteTransitGatewayMulticastDomain" ::
                      Prelude.ByteString
                  ),
        ByteString
"Version"
          forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: (ByteString
"2016-11-15" :: Prelude.ByteString),
        ByteString
"DryRun" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Bool
dryRun,
        ByteString
"TransitGatewayMulticastDomainId"
          forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Text
transitGatewayMulticastDomainId
      ]

-- | /See:/ 'newDeleteTransitGatewayMulticastDomainResponse' smart constructor.
data DeleteTransitGatewayMulticastDomainResponse = DeleteTransitGatewayMulticastDomainResponse'
  { -- | Information about the deleted transit gateway multicast domain.
    DeleteTransitGatewayMulticastDomainResponse
-> Maybe TransitGatewayMulticastDomain
transitGatewayMulticastDomain :: Prelude.Maybe TransitGatewayMulticastDomain,
    -- | The response's http status code.
    DeleteTransitGatewayMulticastDomainResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (DeleteTransitGatewayMulticastDomainResponse
-> DeleteTransitGatewayMulticastDomainResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DeleteTransitGatewayMulticastDomainResponse
-> DeleteTransitGatewayMulticastDomainResponse -> Bool
$c/= :: DeleteTransitGatewayMulticastDomainResponse
-> DeleteTransitGatewayMulticastDomainResponse -> Bool
== :: DeleteTransitGatewayMulticastDomainResponse
-> DeleteTransitGatewayMulticastDomainResponse -> Bool
$c== :: DeleteTransitGatewayMulticastDomainResponse
-> DeleteTransitGatewayMulticastDomainResponse -> Bool
Prelude.Eq, ReadPrec [DeleteTransitGatewayMulticastDomainResponse]
ReadPrec DeleteTransitGatewayMulticastDomainResponse
Int -> ReadS DeleteTransitGatewayMulticastDomainResponse
ReadS [DeleteTransitGatewayMulticastDomainResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DeleteTransitGatewayMulticastDomainResponse]
$creadListPrec :: ReadPrec [DeleteTransitGatewayMulticastDomainResponse]
readPrec :: ReadPrec DeleteTransitGatewayMulticastDomainResponse
$creadPrec :: ReadPrec DeleteTransitGatewayMulticastDomainResponse
readList :: ReadS [DeleteTransitGatewayMulticastDomainResponse]
$creadList :: ReadS [DeleteTransitGatewayMulticastDomainResponse]
readsPrec :: Int -> ReadS DeleteTransitGatewayMulticastDomainResponse
$creadsPrec :: Int -> ReadS DeleteTransitGatewayMulticastDomainResponse
Prelude.Read, Int -> DeleteTransitGatewayMulticastDomainResponse -> ShowS
[DeleteTransitGatewayMulticastDomainResponse] -> ShowS
DeleteTransitGatewayMulticastDomainResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DeleteTransitGatewayMulticastDomainResponse] -> ShowS
$cshowList :: [DeleteTransitGatewayMulticastDomainResponse] -> ShowS
show :: DeleteTransitGatewayMulticastDomainResponse -> String
$cshow :: DeleteTransitGatewayMulticastDomainResponse -> String
showsPrec :: Int -> DeleteTransitGatewayMulticastDomainResponse -> ShowS
$cshowsPrec :: Int -> DeleteTransitGatewayMulticastDomainResponse -> ShowS
Prelude.Show, forall x.
Rep DeleteTransitGatewayMulticastDomainResponse x
-> DeleteTransitGatewayMulticastDomainResponse
forall x.
DeleteTransitGatewayMulticastDomainResponse
-> Rep DeleteTransitGatewayMulticastDomainResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DeleteTransitGatewayMulticastDomainResponse x
-> DeleteTransitGatewayMulticastDomainResponse
$cfrom :: forall x.
DeleteTransitGatewayMulticastDomainResponse
-> Rep DeleteTransitGatewayMulticastDomainResponse x
Prelude.Generic)

-- |
-- Create a value of 'DeleteTransitGatewayMulticastDomainResponse' with all optional fields omitted.
--
-- Use <https://hackage.haskell.org/package/generic-lens generic-lens> or <https://hackage.haskell.org/package/optics optics> to modify other optional fields.
--
-- The following record fields are available, with the corresponding lenses provided
-- for backwards compatibility:
--
-- 'transitGatewayMulticastDomain', 'deleteTransitGatewayMulticastDomainResponse_transitGatewayMulticastDomain' - Information about the deleted transit gateway multicast domain.
--
-- 'httpStatus', 'deleteTransitGatewayMulticastDomainResponse_httpStatus' - The response's http status code.
newDeleteTransitGatewayMulticastDomainResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  DeleteTransitGatewayMulticastDomainResponse
newDeleteTransitGatewayMulticastDomainResponse :: Int -> DeleteTransitGatewayMulticastDomainResponse
newDeleteTransitGatewayMulticastDomainResponse
  Int
pHttpStatus_ =
    DeleteTransitGatewayMulticastDomainResponse'
      { $sel:transitGatewayMulticastDomain:DeleteTransitGatewayMulticastDomainResponse' :: Maybe TransitGatewayMulticastDomain
transitGatewayMulticastDomain =
          forall a. Maybe a
Prelude.Nothing,
        $sel:httpStatus:DeleteTransitGatewayMulticastDomainResponse' :: Int
httpStatus = Int
pHttpStatus_
      }

-- | Information about the deleted transit gateway multicast domain.
deleteTransitGatewayMulticastDomainResponse_transitGatewayMulticastDomain :: Lens.Lens' DeleteTransitGatewayMulticastDomainResponse (Prelude.Maybe TransitGatewayMulticastDomain)
deleteTransitGatewayMulticastDomainResponse_transitGatewayMulticastDomain :: Lens'
  DeleteTransitGatewayMulticastDomainResponse
  (Maybe TransitGatewayMulticastDomain)
deleteTransitGatewayMulticastDomainResponse_transitGatewayMulticastDomain = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeleteTransitGatewayMulticastDomainResponse' {Maybe TransitGatewayMulticastDomain
transitGatewayMulticastDomain :: Maybe TransitGatewayMulticastDomain
$sel:transitGatewayMulticastDomain:DeleteTransitGatewayMulticastDomainResponse' :: DeleteTransitGatewayMulticastDomainResponse
-> Maybe TransitGatewayMulticastDomain
transitGatewayMulticastDomain} -> Maybe TransitGatewayMulticastDomain
transitGatewayMulticastDomain) (\s :: DeleteTransitGatewayMulticastDomainResponse
s@DeleteTransitGatewayMulticastDomainResponse' {} Maybe TransitGatewayMulticastDomain
a -> DeleteTransitGatewayMulticastDomainResponse
s {$sel:transitGatewayMulticastDomain:DeleteTransitGatewayMulticastDomainResponse' :: Maybe TransitGatewayMulticastDomain
transitGatewayMulticastDomain = Maybe TransitGatewayMulticastDomain
a} :: DeleteTransitGatewayMulticastDomainResponse)

-- | The response's http status code.
deleteTransitGatewayMulticastDomainResponse_httpStatus :: Lens.Lens' DeleteTransitGatewayMulticastDomainResponse Prelude.Int
deleteTransitGatewayMulticastDomainResponse_httpStatus :: Lens' DeleteTransitGatewayMulticastDomainResponse Int
deleteTransitGatewayMulticastDomainResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeleteTransitGatewayMulticastDomainResponse' {Int
httpStatus :: Int
$sel:httpStatus:DeleteTransitGatewayMulticastDomainResponse' :: DeleteTransitGatewayMulticastDomainResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: DeleteTransitGatewayMulticastDomainResponse
s@DeleteTransitGatewayMulticastDomainResponse' {} Int
a -> DeleteTransitGatewayMulticastDomainResponse
s {$sel:httpStatus:DeleteTransitGatewayMulticastDomainResponse' :: Int
httpStatus = Int
a} :: DeleteTransitGatewayMulticastDomainResponse)

instance
  Prelude.NFData
    DeleteTransitGatewayMulticastDomainResponse
  where
  rnf :: DeleteTransitGatewayMulticastDomainResponse -> ()
rnf DeleteTransitGatewayMulticastDomainResponse' {Int
Maybe TransitGatewayMulticastDomain
httpStatus :: Int
transitGatewayMulticastDomain :: Maybe TransitGatewayMulticastDomain
$sel:httpStatus:DeleteTransitGatewayMulticastDomainResponse' :: DeleteTransitGatewayMulticastDomainResponse -> Int
$sel:transitGatewayMulticastDomain:DeleteTransitGatewayMulticastDomainResponse' :: DeleteTransitGatewayMulticastDomainResponse
-> Maybe TransitGatewayMulticastDomain
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe TransitGatewayMulticastDomain
transitGatewayMulticastDomain
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus