{-# 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.DirectConnect.DeleteDirectConnectGatewayAssociation
-- 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 association between the specified Direct Connect gateway and
-- virtual private gateway.
--
-- We recommend that you specify the @associationID@ to delete the
-- association. Alternatively, if you own virtual gateway and a Direct
-- Connect gateway association, you can specify the @virtualGatewayId@ and
-- @directConnectGatewayId@ to delete an association.
module Amazonka.DirectConnect.DeleteDirectConnectGatewayAssociation
  ( -- * Creating a Request
    DeleteDirectConnectGatewayAssociation (..),
    newDeleteDirectConnectGatewayAssociation,

    -- * Request Lenses
    deleteDirectConnectGatewayAssociation_associationId,
    deleteDirectConnectGatewayAssociation_directConnectGatewayId,
    deleteDirectConnectGatewayAssociation_virtualGatewayId,

    -- * Destructuring the Response
    DeleteDirectConnectGatewayAssociationResponse (..),
    newDeleteDirectConnectGatewayAssociationResponse,

    -- * Response Lenses
    deleteDirectConnectGatewayAssociationResponse_directConnectGatewayAssociation,
    deleteDirectConnectGatewayAssociationResponse_httpStatus,
  )
where

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

-- | /See:/ 'newDeleteDirectConnectGatewayAssociation' smart constructor.
data DeleteDirectConnectGatewayAssociation = DeleteDirectConnectGatewayAssociation'
  { -- | The ID of the Direct Connect gateway association.
    DeleteDirectConnectGatewayAssociation -> Maybe Text
associationId :: Prelude.Maybe Prelude.Text,
    -- | The ID of the Direct Connect gateway.
    DeleteDirectConnectGatewayAssociation -> Maybe Text
directConnectGatewayId :: Prelude.Maybe Prelude.Text,
    -- | The ID of the virtual private gateway.
    DeleteDirectConnectGatewayAssociation -> Maybe Text
virtualGatewayId :: Prelude.Maybe Prelude.Text
  }
  deriving (DeleteDirectConnectGatewayAssociation
-> DeleteDirectConnectGatewayAssociation -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DeleteDirectConnectGatewayAssociation
-> DeleteDirectConnectGatewayAssociation -> Bool
$c/= :: DeleteDirectConnectGatewayAssociation
-> DeleteDirectConnectGatewayAssociation -> Bool
== :: DeleteDirectConnectGatewayAssociation
-> DeleteDirectConnectGatewayAssociation -> Bool
$c== :: DeleteDirectConnectGatewayAssociation
-> DeleteDirectConnectGatewayAssociation -> Bool
Prelude.Eq, ReadPrec [DeleteDirectConnectGatewayAssociation]
ReadPrec DeleteDirectConnectGatewayAssociation
Int -> ReadS DeleteDirectConnectGatewayAssociation
ReadS [DeleteDirectConnectGatewayAssociation]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DeleteDirectConnectGatewayAssociation]
$creadListPrec :: ReadPrec [DeleteDirectConnectGatewayAssociation]
readPrec :: ReadPrec DeleteDirectConnectGatewayAssociation
$creadPrec :: ReadPrec DeleteDirectConnectGatewayAssociation
readList :: ReadS [DeleteDirectConnectGatewayAssociation]
$creadList :: ReadS [DeleteDirectConnectGatewayAssociation]
readsPrec :: Int -> ReadS DeleteDirectConnectGatewayAssociation
$creadsPrec :: Int -> ReadS DeleteDirectConnectGatewayAssociation
Prelude.Read, Int -> DeleteDirectConnectGatewayAssociation -> ShowS
[DeleteDirectConnectGatewayAssociation] -> ShowS
DeleteDirectConnectGatewayAssociation -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DeleteDirectConnectGatewayAssociation] -> ShowS
$cshowList :: [DeleteDirectConnectGatewayAssociation] -> ShowS
show :: DeleteDirectConnectGatewayAssociation -> String
$cshow :: DeleteDirectConnectGatewayAssociation -> String
showsPrec :: Int -> DeleteDirectConnectGatewayAssociation -> ShowS
$cshowsPrec :: Int -> DeleteDirectConnectGatewayAssociation -> ShowS
Prelude.Show, forall x.
Rep DeleteDirectConnectGatewayAssociation x
-> DeleteDirectConnectGatewayAssociation
forall x.
DeleteDirectConnectGatewayAssociation
-> Rep DeleteDirectConnectGatewayAssociation x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DeleteDirectConnectGatewayAssociation x
-> DeleteDirectConnectGatewayAssociation
$cfrom :: forall x.
DeleteDirectConnectGatewayAssociation
-> Rep DeleteDirectConnectGatewayAssociation x
Prelude.Generic)

-- |
-- Create a value of 'DeleteDirectConnectGatewayAssociation' 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:
--
-- 'associationId', 'deleteDirectConnectGatewayAssociation_associationId' - The ID of the Direct Connect gateway association.
--
-- 'directConnectGatewayId', 'deleteDirectConnectGatewayAssociation_directConnectGatewayId' - The ID of the Direct Connect gateway.
--
-- 'virtualGatewayId', 'deleteDirectConnectGatewayAssociation_virtualGatewayId' - The ID of the virtual private gateway.
newDeleteDirectConnectGatewayAssociation ::
  DeleteDirectConnectGatewayAssociation
newDeleteDirectConnectGatewayAssociation :: DeleteDirectConnectGatewayAssociation
newDeleteDirectConnectGatewayAssociation =
  DeleteDirectConnectGatewayAssociation'
    { $sel:associationId:DeleteDirectConnectGatewayAssociation' :: Maybe Text
associationId =
        forall a. Maybe a
Prelude.Nothing,
      $sel:directConnectGatewayId:DeleteDirectConnectGatewayAssociation' :: Maybe Text
directConnectGatewayId =
        forall a. Maybe a
Prelude.Nothing,
      $sel:virtualGatewayId:DeleteDirectConnectGatewayAssociation' :: Maybe Text
virtualGatewayId = forall a. Maybe a
Prelude.Nothing
    }

-- | The ID of the Direct Connect gateway association.
deleteDirectConnectGatewayAssociation_associationId :: Lens.Lens' DeleteDirectConnectGatewayAssociation (Prelude.Maybe Prelude.Text)
deleteDirectConnectGatewayAssociation_associationId :: Lens' DeleteDirectConnectGatewayAssociation (Maybe Text)
deleteDirectConnectGatewayAssociation_associationId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeleteDirectConnectGatewayAssociation' {Maybe Text
associationId :: Maybe Text
$sel:associationId:DeleteDirectConnectGatewayAssociation' :: DeleteDirectConnectGatewayAssociation -> Maybe Text
associationId} -> Maybe Text
associationId) (\s :: DeleteDirectConnectGatewayAssociation
s@DeleteDirectConnectGatewayAssociation' {} Maybe Text
a -> DeleteDirectConnectGatewayAssociation
s {$sel:associationId:DeleteDirectConnectGatewayAssociation' :: Maybe Text
associationId = Maybe Text
a} :: DeleteDirectConnectGatewayAssociation)

-- | The ID of the Direct Connect gateway.
deleteDirectConnectGatewayAssociation_directConnectGatewayId :: Lens.Lens' DeleteDirectConnectGatewayAssociation (Prelude.Maybe Prelude.Text)
deleteDirectConnectGatewayAssociation_directConnectGatewayId :: Lens' DeleteDirectConnectGatewayAssociation (Maybe Text)
deleteDirectConnectGatewayAssociation_directConnectGatewayId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeleteDirectConnectGatewayAssociation' {Maybe Text
directConnectGatewayId :: Maybe Text
$sel:directConnectGatewayId:DeleteDirectConnectGatewayAssociation' :: DeleteDirectConnectGatewayAssociation -> Maybe Text
directConnectGatewayId} -> Maybe Text
directConnectGatewayId) (\s :: DeleteDirectConnectGatewayAssociation
s@DeleteDirectConnectGatewayAssociation' {} Maybe Text
a -> DeleteDirectConnectGatewayAssociation
s {$sel:directConnectGatewayId:DeleteDirectConnectGatewayAssociation' :: Maybe Text
directConnectGatewayId = Maybe Text
a} :: DeleteDirectConnectGatewayAssociation)

-- | The ID of the virtual private gateway.
deleteDirectConnectGatewayAssociation_virtualGatewayId :: Lens.Lens' DeleteDirectConnectGatewayAssociation (Prelude.Maybe Prelude.Text)
deleteDirectConnectGatewayAssociation_virtualGatewayId :: Lens' DeleteDirectConnectGatewayAssociation (Maybe Text)
deleteDirectConnectGatewayAssociation_virtualGatewayId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeleteDirectConnectGatewayAssociation' {Maybe Text
virtualGatewayId :: Maybe Text
$sel:virtualGatewayId:DeleteDirectConnectGatewayAssociation' :: DeleteDirectConnectGatewayAssociation -> Maybe Text
virtualGatewayId} -> Maybe Text
virtualGatewayId) (\s :: DeleteDirectConnectGatewayAssociation
s@DeleteDirectConnectGatewayAssociation' {} Maybe Text
a -> DeleteDirectConnectGatewayAssociation
s {$sel:virtualGatewayId:DeleteDirectConnectGatewayAssociation' :: Maybe Text
virtualGatewayId = Maybe Text
a} :: DeleteDirectConnectGatewayAssociation)

instance
  Core.AWSRequest
    DeleteDirectConnectGatewayAssociation
  where
  type
    AWSResponse
      DeleteDirectConnectGatewayAssociation =
      DeleteDirectConnectGatewayAssociationResponse
  request :: (Service -> Service)
-> DeleteDirectConnectGatewayAssociation
-> Request DeleteDirectConnectGatewayAssociation
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 DeleteDirectConnectGatewayAssociation
-> ClientResponse ClientBody
-> m (Either
        Error
        (ClientResponse
           (AWSResponse DeleteDirectConnectGatewayAssociation)))
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 DirectConnectGatewayAssociation
-> Int -> DeleteDirectConnectGatewayAssociationResponse
DeleteDirectConnectGatewayAssociationResponse'
            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
"directConnectGatewayAssociation")
            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
    DeleteDirectConnectGatewayAssociation
  where
  hashWithSalt :: Int -> DeleteDirectConnectGatewayAssociation -> Int
hashWithSalt
    Int
_salt
    DeleteDirectConnectGatewayAssociation' {Maybe Text
virtualGatewayId :: Maybe Text
directConnectGatewayId :: Maybe Text
associationId :: Maybe Text
$sel:virtualGatewayId:DeleteDirectConnectGatewayAssociation' :: DeleteDirectConnectGatewayAssociation -> Maybe Text
$sel:directConnectGatewayId:DeleteDirectConnectGatewayAssociation' :: DeleteDirectConnectGatewayAssociation -> Maybe Text
$sel:associationId:DeleteDirectConnectGatewayAssociation' :: DeleteDirectConnectGatewayAssociation -> Maybe Text
..} =
      Int
_salt
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
associationId
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
directConnectGatewayId
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
virtualGatewayId

instance
  Prelude.NFData
    DeleteDirectConnectGatewayAssociation
  where
  rnf :: DeleteDirectConnectGatewayAssociation -> ()
rnf DeleteDirectConnectGatewayAssociation' {Maybe Text
virtualGatewayId :: Maybe Text
directConnectGatewayId :: Maybe Text
associationId :: Maybe Text
$sel:virtualGatewayId:DeleteDirectConnectGatewayAssociation' :: DeleteDirectConnectGatewayAssociation -> Maybe Text
$sel:directConnectGatewayId:DeleteDirectConnectGatewayAssociation' :: DeleteDirectConnectGatewayAssociation -> Maybe Text
$sel:associationId:DeleteDirectConnectGatewayAssociation' :: DeleteDirectConnectGatewayAssociation -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
associationId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
directConnectGatewayId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
virtualGatewayId

instance
  Data.ToHeaders
    DeleteDirectConnectGatewayAssociation
  where
  toHeaders :: DeleteDirectConnectGatewayAssociation -> 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
"OvertureService.DeleteDirectConnectGatewayAssociation" ::
                          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
    DeleteDirectConnectGatewayAssociation
  where
  toJSON :: DeleteDirectConnectGatewayAssociation -> Value
toJSON DeleteDirectConnectGatewayAssociation' {Maybe Text
virtualGatewayId :: Maybe Text
directConnectGatewayId :: Maybe Text
associationId :: Maybe Text
$sel:virtualGatewayId:DeleteDirectConnectGatewayAssociation' :: DeleteDirectConnectGatewayAssociation -> Maybe Text
$sel:directConnectGatewayId:DeleteDirectConnectGatewayAssociation' :: DeleteDirectConnectGatewayAssociation -> Maybe Text
$sel:associationId:DeleteDirectConnectGatewayAssociation' :: DeleteDirectConnectGatewayAssociation -> Maybe Text
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"associationId" 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 Text
associationId,
            (Key
"directConnectGatewayId" 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 Text
directConnectGatewayId,
            (Key
"virtualGatewayId" 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 Text
virtualGatewayId
          ]
      )

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

instance
  Data.ToQuery
    DeleteDirectConnectGatewayAssociation
  where
  toQuery :: DeleteDirectConnectGatewayAssociation -> QueryString
toQuery = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty

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

-- |
-- Create a value of 'DeleteDirectConnectGatewayAssociationResponse' 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:
--
-- 'directConnectGatewayAssociation', 'deleteDirectConnectGatewayAssociationResponse_directConnectGatewayAssociation' - Information about the deleted association.
--
-- 'httpStatus', 'deleteDirectConnectGatewayAssociationResponse_httpStatus' - The response's http status code.
newDeleteDirectConnectGatewayAssociationResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  DeleteDirectConnectGatewayAssociationResponse
newDeleteDirectConnectGatewayAssociationResponse :: Int -> DeleteDirectConnectGatewayAssociationResponse
newDeleteDirectConnectGatewayAssociationResponse
  Int
pHttpStatus_ =
    DeleteDirectConnectGatewayAssociationResponse'
      { $sel:directConnectGatewayAssociation:DeleteDirectConnectGatewayAssociationResponse' :: Maybe DirectConnectGatewayAssociation
directConnectGatewayAssociation =
          forall a. Maybe a
Prelude.Nothing,
        $sel:httpStatus:DeleteDirectConnectGatewayAssociationResponse' :: Int
httpStatus = Int
pHttpStatus_
      }

-- | Information about the deleted association.
deleteDirectConnectGatewayAssociationResponse_directConnectGatewayAssociation :: Lens.Lens' DeleteDirectConnectGatewayAssociationResponse (Prelude.Maybe DirectConnectGatewayAssociation)
deleteDirectConnectGatewayAssociationResponse_directConnectGatewayAssociation :: Lens'
  DeleteDirectConnectGatewayAssociationResponse
  (Maybe DirectConnectGatewayAssociation)
deleteDirectConnectGatewayAssociationResponse_directConnectGatewayAssociation = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeleteDirectConnectGatewayAssociationResponse' {Maybe DirectConnectGatewayAssociation
directConnectGatewayAssociation :: Maybe DirectConnectGatewayAssociation
$sel:directConnectGatewayAssociation:DeleteDirectConnectGatewayAssociationResponse' :: DeleteDirectConnectGatewayAssociationResponse
-> Maybe DirectConnectGatewayAssociation
directConnectGatewayAssociation} -> Maybe DirectConnectGatewayAssociation
directConnectGatewayAssociation) (\s :: DeleteDirectConnectGatewayAssociationResponse
s@DeleteDirectConnectGatewayAssociationResponse' {} Maybe DirectConnectGatewayAssociation
a -> DeleteDirectConnectGatewayAssociationResponse
s {$sel:directConnectGatewayAssociation:DeleteDirectConnectGatewayAssociationResponse' :: Maybe DirectConnectGatewayAssociation
directConnectGatewayAssociation = Maybe DirectConnectGatewayAssociation
a} :: DeleteDirectConnectGatewayAssociationResponse)

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

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