{-# 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.DeregisterTransitGatewayMulticastGroupSources
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Deregisters the specified sources (network interfaces) from the transit
-- gateway multicast group.
module Amazonka.EC2.DeregisterTransitGatewayMulticastGroupSources
  ( -- * Creating a Request
    DeregisterTransitGatewayMulticastGroupSources (..),
    newDeregisterTransitGatewayMulticastGroupSources,

    -- * Request Lenses
    deregisterTransitGatewayMulticastGroupSources_dryRun,
    deregisterTransitGatewayMulticastGroupSources_groupIpAddress,
    deregisterTransitGatewayMulticastGroupSources_networkInterfaceIds,
    deregisterTransitGatewayMulticastGroupSources_transitGatewayMulticastDomainId,

    -- * Destructuring the Response
    DeregisterTransitGatewayMulticastGroupSourcesResponse (..),
    newDeregisterTransitGatewayMulticastGroupSourcesResponse,

    -- * Response Lenses
    deregisterTransitGatewayMulticastGroupSourcesResponse_deregisteredMulticastGroupSources,
    deregisterTransitGatewayMulticastGroupSourcesResponse_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:/ 'newDeregisterTransitGatewayMulticastGroupSources' smart constructor.
data DeregisterTransitGatewayMulticastGroupSources = DeregisterTransitGatewayMulticastGroupSources'
  { -- | 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@.
    DeregisterTransitGatewayMulticastGroupSources -> Maybe Bool
dryRun :: Prelude.Maybe Prelude.Bool,
    -- | The IP address assigned to the transit gateway multicast group.
    DeregisterTransitGatewayMulticastGroupSources -> Maybe Text
groupIpAddress :: Prelude.Maybe Prelude.Text,
    -- | The IDs of the group sources\' network interfaces.
    DeregisterTransitGatewayMulticastGroupSources -> Maybe [Text]
networkInterfaceIds :: Prelude.Maybe [Prelude.Text],
    -- | The ID of the transit gateway multicast domain.
    DeregisterTransitGatewayMulticastGroupSources -> Maybe Text
transitGatewayMulticastDomainId :: Prelude.Maybe Prelude.Text
  }
  deriving (DeregisterTransitGatewayMulticastGroupSources
-> DeregisterTransitGatewayMulticastGroupSources -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DeregisterTransitGatewayMulticastGroupSources
-> DeregisterTransitGatewayMulticastGroupSources -> Bool
$c/= :: DeregisterTransitGatewayMulticastGroupSources
-> DeregisterTransitGatewayMulticastGroupSources -> Bool
== :: DeregisterTransitGatewayMulticastGroupSources
-> DeregisterTransitGatewayMulticastGroupSources -> Bool
$c== :: DeregisterTransitGatewayMulticastGroupSources
-> DeregisterTransitGatewayMulticastGroupSources -> Bool
Prelude.Eq, ReadPrec [DeregisterTransitGatewayMulticastGroupSources]
ReadPrec DeregisterTransitGatewayMulticastGroupSources
Int -> ReadS DeregisterTransitGatewayMulticastGroupSources
ReadS [DeregisterTransitGatewayMulticastGroupSources]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DeregisterTransitGatewayMulticastGroupSources]
$creadListPrec :: ReadPrec [DeregisterTransitGatewayMulticastGroupSources]
readPrec :: ReadPrec DeregisterTransitGatewayMulticastGroupSources
$creadPrec :: ReadPrec DeregisterTransitGatewayMulticastGroupSources
readList :: ReadS [DeregisterTransitGatewayMulticastGroupSources]
$creadList :: ReadS [DeregisterTransitGatewayMulticastGroupSources]
readsPrec :: Int -> ReadS DeregisterTransitGatewayMulticastGroupSources
$creadsPrec :: Int -> ReadS DeregisterTransitGatewayMulticastGroupSources
Prelude.Read, Int -> DeregisterTransitGatewayMulticastGroupSources -> ShowS
[DeregisterTransitGatewayMulticastGroupSources] -> ShowS
DeregisterTransitGatewayMulticastGroupSources -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DeregisterTransitGatewayMulticastGroupSources] -> ShowS
$cshowList :: [DeregisterTransitGatewayMulticastGroupSources] -> ShowS
show :: DeregisterTransitGatewayMulticastGroupSources -> String
$cshow :: DeregisterTransitGatewayMulticastGroupSources -> String
showsPrec :: Int -> DeregisterTransitGatewayMulticastGroupSources -> ShowS
$cshowsPrec :: Int -> DeregisterTransitGatewayMulticastGroupSources -> ShowS
Prelude.Show, forall x.
Rep DeregisterTransitGatewayMulticastGroupSources x
-> DeregisterTransitGatewayMulticastGroupSources
forall x.
DeregisterTransitGatewayMulticastGroupSources
-> Rep DeregisterTransitGatewayMulticastGroupSources x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DeregisterTransitGatewayMulticastGroupSources x
-> DeregisterTransitGatewayMulticastGroupSources
$cfrom :: forall x.
DeregisterTransitGatewayMulticastGroupSources
-> Rep DeregisterTransitGatewayMulticastGroupSources x
Prelude.Generic)

-- |
-- Create a value of 'DeregisterTransitGatewayMulticastGroupSources' 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', 'deregisterTransitGatewayMulticastGroupSources_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@.
--
-- 'groupIpAddress', 'deregisterTransitGatewayMulticastGroupSources_groupIpAddress' - The IP address assigned to the transit gateway multicast group.
--
-- 'networkInterfaceIds', 'deregisterTransitGatewayMulticastGroupSources_networkInterfaceIds' - The IDs of the group sources\' network interfaces.
--
-- 'transitGatewayMulticastDomainId', 'deregisterTransitGatewayMulticastGroupSources_transitGatewayMulticastDomainId' - The ID of the transit gateway multicast domain.
newDeregisterTransitGatewayMulticastGroupSources ::
  DeregisterTransitGatewayMulticastGroupSources
newDeregisterTransitGatewayMulticastGroupSources :: DeregisterTransitGatewayMulticastGroupSources
newDeregisterTransitGatewayMulticastGroupSources =
  DeregisterTransitGatewayMulticastGroupSources'
    { $sel:dryRun:DeregisterTransitGatewayMulticastGroupSources' :: Maybe Bool
dryRun =
        forall a. Maybe a
Prelude.Nothing,
      $sel:groupIpAddress:DeregisterTransitGatewayMulticastGroupSources' :: Maybe Text
groupIpAddress =
        forall a. Maybe a
Prelude.Nothing,
      $sel:networkInterfaceIds:DeregisterTransitGatewayMulticastGroupSources' :: Maybe [Text]
networkInterfaceIds =
        forall a. Maybe a
Prelude.Nothing,
      $sel:transitGatewayMulticastDomainId:DeregisterTransitGatewayMulticastGroupSources' :: Maybe Text
transitGatewayMulticastDomainId =
        forall a. Maybe a
Prelude.Nothing
    }

-- | 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@.
deregisterTransitGatewayMulticastGroupSources_dryRun :: Lens.Lens' DeregisterTransitGatewayMulticastGroupSources (Prelude.Maybe Prelude.Bool)
deregisterTransitGatewayMulticastGroupSources_dryRun :: Lens' DeregisterTransitGatewayMulticastGroupSources (Maybe Bool)
deregisterTransitGatewayMulticastGroupSources_dryRun = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeregisterTransitGatewayMulticastGroupSources' {Maybe Bool
dryRun :: Maybe Bool
$sel:dryRun:DeregisterTransitGatewayMulticastGroupSources' :: DeregisterTransitGatewayMulticastGroupSources -> Maybe Bool
dryRun} -> Maybe Bool
dryRun) (\s :: DeregisterTransitGatewayMulticastGroupSources
s@DeregisterTransitGatewayMulticastGroupSources' {} Maybe Bool
a -> DeregisterTransitGatewayMulticastGroupSources
s {$sel:dryRun:DeregisterTransitGatewayMulticastGroupSources' :: Maybe Bool
dryRun = Maybe Bool
a} :: DeregisterTransitGatewayMulticastGroupSources)

-- | The IP address assigned to the transit gateway multicast group.
deregisterTransitGatewayMulticastGroupSources_groupIpAddress :: Lens.Lens' DeregisterTransitGatewayMulticastGroupSources (Prelude.Maybe Prelude.Text)
deregisterTransitGatewayMulticastGroupSources_groupIpAddress :: Lens' DeregisterTransitGatewayMulticastGroupSources (Maybe Text)
deregisterTransitGatewayMulticastGroupSources_groupIpAddress = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeregisterTransitGatewayMulticastGroupSources' {Maybe Text
groupIpAddress :: Maybe Text
$sel:groupIpAddress:DeregisterTransitGatewayMulticastGroupSources' :: DeregisterTransitGatewayMulticastGroupSources -> Maybe Text
groupIpAddress} -> Maybe Text
groupIpAddress) (\s :: DeregisterTransitGatewayMulticastGroupSources
s@DeregisterTransitGatewayMulticastGroupSources' {} Maybe Text
a -> DeregisterTransitGatewayMulticastGroupSources
s {$sel:groupIpAddress:DeregisterTransitGatewayMulticastGroupSources' :: Maybe Text
groupIpAddress = Maybe Text
a} :: DeregisterTransitGatewayMulticastGroupSources)

-- | The IDs of the group sources\' network interfaces.
deregisterTransitGatewayMulticastGroupSources_networkInterfaceIds :: Lens.Lens' DeregisterTransitGatewayMulticastGroupSources (Prelude.Maybe [Prelude.Text])
deregisterTransitGatewayMulticastGroupSources_networkInterfaceIds :: Lens' DeregisterTransitGatewayMulticastGroupSources (Maybe [Text])
deregisterTransitGatewayMulticastGroupSources_networkInterfaceIds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeregisterTransitGatewayMulticastGroupSources' {Maybe [Text]
networkInterfaceIds :: Maybe [Text]
$sel:networkInterfaceIds:DeregisterTransitGatewayMulticastGroupSources' :: DeregisterTransitGatewayMulticastGroupSources -> Maybe [Text]
networkInterfaceIds} -> Maybe [Text]
networkInterfaceIds) (\s :: DeregisterTransitGatewayMulticastGroupSources
s@DeregisterTransitGatewayMulticastGroupSources' {} Maybe [Text]
a -> DeregisterTransitGatewayMulticastGroupSources
s {$sel:networkInterfaceIds:DeregisterTransitGatewayMulticastGroupSources' :: Maybe [Text]
networkInterfaceIds = Maybe [Text]
a} :: DeregisterTransitGatewayMulticastGroupSources) 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

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

instance
  Core.AWSRequest
    DeregisterTransitGatewayMulticastGroupSources
  where
  type
    AWSResponse
      DeregisterTransitGatewayMulticastGroupSources =
      DeregisterTransitGatewayMulticastGroupSourcesResponse
  request :: (Service -> Service)
-> DeregisterTransitGatewayMulticastGroupSources
-> Request DeregisterTransitGatewayMulticastGroupSources
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 DeregisterTransitGatewayMulticastGroupSources
-> ClientResponse ClientBody
-> m (Either
        Error
        (ClientResponse
           (AWSResponse DeregisterTransitGatewayMulticastGroupSources)))
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 TransitGatewayMulticastDeregisteredGroupSources
-> Int -> DeregisterTransitGatewayMulticastGroupSourcesResponse
DeregisterTransitGatewayMulticastGroupSourcesResponse'
            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
"deregisteredMulticastGroupSources")
            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
    DeregisterTransitGatewayMulticastGroupSources
  where
  hashWithSalt :: Int -> DeregisterTransitGatewayMulticastGroupSources -> Int
hashWithSalt
    Int
_salt
    DeregisterTransitGatewayMulticastGroupSources' {Maybe Bool
Maybe [Text]
Maybe Text
transitGatewayMulticastDomainId :: Maybe Text
networkInterfaceIds :: Maybe [Text]
groupIpAddress :: Maybe Text
dryRun :: Maybe Bool
$sel:transitGatewayMulticastDomainId:DeregisterTransitGatewayMulticastGroupSources' :: DeregisterTransitGatewayMulticastGroupSources -> Maybe Text
$sel:networkInterfaceIds:DeregisterTransitGatewayMulticastGroupSources' :: DeregisterTransitGatewayMulticastGroupSources -> Maybe [Text]
$sel:groupIpAddress:DeregisterTransitGatewayMulticastGroupSources' :: DeregisterTransitGatewayMulticastGroupSources -> Maybe Text
$sel:dryRun:DeregisterTransitGatewayMulticastGroupSources' :: DeregisterTransitGatewayMulticastGroupSources -> 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` Maybe Text
groupIpAddress
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Text]
networkInterfaceIds
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
transitGatewayMulticastDomainId

instance
  Prelude.NFData
    DeregisterTransitGatewayMulticastGroupSources
  where
  rnf :: DeregisterTransitGatewayMulticastGroupSources -> ()
rnf
    DeregisterTransitGatewayMulticastGroupSources' {Maybe Bool
Maybe [Text]
Maybe Text
transitGatewayMulticastDomainId :: Maybe Text
networkInterfaceIds :: Maybe [Text]
groupIpAddress :: Maybe Text
dryRun :: Maybe Bool
$sel:transitGatewayMulticastDomainId:DeregisterTransitGatewayMulticastGroupSources' :: DeregisterTransitGatewayMulticastGroupSources -> Maybe Text
$sel:networkInterfaceIds:DeregisterTransitGatewayMulticastGroupSources' :: DeregisterTransitGatewayMulticastGroupSources -> Maybe [Text]
$sel:groupIpAddress:DeregisterTransitGatewayMulticastGroupSources' :: DeregisterTransitGatewayMulticastGroupSources -> Maybe Text
$sel:dryRun:DeregisterTransitGatewayMulticastGroupSources' :: DeregisterTransitGatewayMulticastGroupSources -> 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 Maybe Text
groupIpAddress
        seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Text]
networkInterfaceIds
        seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
transitGatewayMulticastDomainId

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

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

instance
  Data.ToQuery
    DeregisterTransitGatewayMulticastGroupSources
  where
  toQuery :: DeregisterTransitGatewayMulticastGroupSources -> QueryString
toQuery
    DeregisterTransitGatewayMulticastGroupSources' {Maybe Bool
Maybe [Text]
Maybe Text
transitGatewayMulticastDomainId :: Maybe Text
networkInterfaceIds :: Maybe [Text]
groupIpAddress :: Maybe Text
dryRun :: Maybe Bool
$sel:transitGatewayMulticastDomainId:DeregisterTransitGatewayMulticastGroupSources' :: DeregisterTransitGatewayMulticastGroupSources -> Maybe Text
$sel:networkInterfaceIds:DeregisterTransitGatewayMulticastGroupSources' :: DeregisterTransitGatewayMulticastGroupSources -> Maybe [Text]
$sel:groupIpAddress:DeregisterTransitGatewayMulticastGroupSources' :: DeregisterTransitGatewayMulticastGroupSources -> Maybe Text
$sel:dryRun:DeregisterTransitGatewayMulticastGroupSources' :: DeregisterTransitGatewayMulticastGroupSources -> Maybe Bool
..} =
      forall a. Monoid a => [a] -> a
Prelude.mconcat
        [ ByteString
"Action"
            forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: ( ByteString
"DeregisterTransitGatewayMulticastGroupSources" ::
                        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
"GroupIpAddress" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
groupIpAddress,
          forall a. ToQuery a => a -> QueryString
Data.toQuery
            ( forall a.
(IsList a, ToQuery (Item a)) =>
ByteString -> a -> QueryString
Data.toQueryList ByteString
"NetworkInterfaceIds"
                forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Text]
networkInterfaceIds
            ),
          ByteString
"TransitGatewayMulticastDomainId"
            forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
transitGatewayMulticastDomainId
        ]

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

-- |
-- Create a value of 'DeregisterTransitGatewayMulticastGroupSourcesResponse' 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:
--
-- 'deregisteredMulticastGroupSources', 'deregisterTransitGatewayMulticastGroupSourcesResponse_deregisteredMulticastGroupSources' - Information about the deregistered group sources.
--
-- 'httpStatus', 'deregisterTransitGatewayMulticastGroupSourcesResponse_httpStatus' - The response's http status code.
newDeregisterTransitGatewayMulticastGroupSourcesResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  DeregisterTransitGatewayMulticastGroupSourcesResponse
newDeregisterTransitGatewayMulticastGroupSourcesResponse :: Int -> DeregisterTransitGatewayMulticastGroupSourcesResponse
newDeregisterTransitGatewayMulticastGroupSourcesResponse
  Int
pHttpStatus_ =
    DeregisterTransitGatewayMulticastGroupSourcesResponse'
      { $sel:deregisteredMulticastGroupSources:DeregisterTransitGatewayMulticastGroupSourcesResponse' :: Maybe TransitGatewayMulticastDeregisteredGroupSources
deregisteredMulticastGroupSources =
          forall a. Maybe a
Prelude.Nothing,
        $sel:httpStatus:DeregisterTransitGatewayMulticastGroupSourcesResponse' :: Int
httpStatus =
          Int
pHttpStatus_
      }

-- | Information about the deregistered group sources.
deregisterTransitGatewayMulticastGroupSourcesResponse_deregisteredMulticastGroupSources :: Lens.Lens' DeregisterTransitGatewayMulticastGroupSourcesResponse (Prelude.Maybe TransitGatewayMulticastDeregisteredGroupSources)
deregisterTransitGatewayMulticastGroupSourcesResponse_deregisteredMulticastGroupSources :: Lens'
  DeregisterTransitGatewayMulticastGroupSourcesResponse
  (Maybe TransitGatewayMulticastDeregisteredGroupSources)
deregisterTransitGatewayMulticastGroupSourcesResponse_deregisteredMulticastGroupSources = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeregisterTransitGatewayMulticastGroupSourcesResponse' {Maybe TransitGatewayMulticastDeregisteredGroupSources
deregisteredMulticastGroupSources :: Maybe TransitGatewayMulticastDeregisteredGroupSources
$sel:deregisteredMulticastGroupSources:DeregisterTransitGatewayMulticastGroupSourcesResponse' :: DeregisterTransitGatewayMulticastGroupSourcesResponse
-> Maybe TransitGatewayMulticastDeregisteredGroupSources
deregisteredMulticastGroupSources} -> Maybe TransitGatewayMulticastDeregisteredGroupSources
deregisteredMulticastGroupSources) (\s :: DeregisterTransitGatewayMulticastGroupSourcesResponse
s@DeregisterTransitGatewayMulticastGroupSourcesResponse' {} Maybe TransitGatewayMulticastDeregisteredGroupSources
a -> DeregisterTransitGatewayMulticastGroupSourcesResponse
s {$sel:deregisteredMulticastGroupSources:DeregisterTransitGatewayMulticastGroupSourcesResponse' :: Maybe TransitGatewayMulticastDeregisteredGroupSources
deregisteredMulticastGroupSources = Maybe TransitGatewayMulticastDeregisteredGroupSources
a} :: DeregisterTransitGatewayMulticastGroupSourcesResponse)

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

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