{-# 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.CloudWatchLogs.DeleteDestination
-- 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 destination, and eventually disables all the
-- subscription filters that publish to it. This operation does not delete
-- the physical resource encapsulated by the destination.
module Amazonka.CloudWatchLogs.DeleteDestination
  ( -- * Creating a Request
    DeleteDestination (..),
    newDeleteDestination,

    -- * Request Lenses
    deleteDestination_destinationName,

    -- * Destructuring the Response
    DeleteDestinationResponse (..),
    newDeleteDestinationResponse,
  )
where

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

-- | /See:/ 'newDeleteDestination' smart constructor.
data DeleteDestination = DeleteDestination'
  { -- | The name of the destination.
    DeleteDestination -> Text
destinationName :: Prelude.Text
  }
  deriving (DeleteDestination -> DeleteDestination -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DeleteDestination -> DeleteDestination -> Bool
$c/= :: DeleteDestination -> DeleteDestination -> Bool
== :: DeleteDestination -> DeleteDestination -> Bool
$c== :: DeleteDestination -> DeleteDestination -> Bool
Prelude.Eq, ReadPrec [DeleteDestination]
ReadPrec DeleteDestination
Int -> ReadS DeleteDestination
ReadS [DeleteDestination]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DeleteDestination]
$creadListPrec :: ReadPrec [DeleteDestination]
readPrec :: ReadPrec DeleteDestination
$creadPrec :: ReadPrec DeleteDestination
readList :: ReadS [DeleteDestination]
$creadList :: ReadS [DeleteDestination]
readsPrec :: Int -> ReadS DeleteDestination
$creadsPrec :: Int -> ReadS DeleteDestination
Prelude.Read, Int -> DeleteDestination -> ShowS
[DeleteDestination] -> ShowS
DeleteDestination -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DeleteDestination] -> ShowS
$cshowList :: [DeleteDestination] -> ShowS
show :: DeleteDestination -> String
$cshow :: DeleteDestination -> String
showsPrec :: Int -> DeleteDestination -> ShowS
$cshowsPrec :: Int -> DeleteDestination -> ShowS
Prelude.Show, forall x. Rep DeleteDestination x -> DeleteDestination
forall x. DeleteDestination -> Rep DeleteDestination x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DeleteDestination x -> DeleteDestination
$cfrom :: forall x. DeleteDestination -> Rep DeleteDestination x
Prelude.Generic)

-- |
-- Create a value of 'DeleteDestination' 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:
--
-- 'destinationName', 'deleteDestination_destinationName' - The name of the destination.
newDeleteDestination ::
  -- | 'destinationName'
  Prelude.Text ->
  DeleteDestination
newDeleteDestination :: Text -> DeleteDestination
newDeleteDestination Text
pDestinationName_ =
  DeleteDestination'
    { $sel:destinationName:DeleteDestination' :: Text
destinationName =
        Text
pDestinationName_
    }

-- | The name of the destination.
deleteDestination_destinationName :: Lens.Lens' DeleteDestination Prelude.Text
deleteDestination_destinationName :: Lens' DeleteDestination Text
deleteDestination_destinationName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeleteDestination' {Text
destinationName :: Text
$sel:destinationName:DeleteDestination' :: DeleteDestination -> Text
destinationName} -> Text
destinationName) (\s :: DeleteDestination
s@DeleteDestination' {} Text
a -> DeleteDestination
s {$sel:destinationName:DeleteDestination' :: Text
destinationName = Text
a} :: DeleteDestination)

instance Core.AWSRequest DeleteDestination where
  type
    AWSResponse DeleteDestination =
      DeleteDestinationResponse
  request :: (Service -> Service)
-> DeleteDestination -> Request DeleteDestination
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 DeleteDestination
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse DeleteDestination)))
response =
    forall (m :: * -> *) a.
MonadResource m =>
AWSResponse a
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveNull DeleteDestinationResponse
DeleteDestinationResponse'

instance Prelude.Hashable DeleteDestination where
  hashWithSalt :: Int -> DeleteDestination -> Int
hashWithSalt Int
_salt DeleteDestination' {Text
destinationName :: Text
$sel:destinationName:DeleteDestination' :: DeleteDestination -> Text
..} =
    Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
destinationName

instance Prelude.NFData DeleteDestination where
  rnf :: DeleteDestination -> ()
rnf DeleteDestination' {Text
destinationName :: Text
$sel:destinationName:DeleteDestination' :: DeleteDestination -> Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Text
destinationName

instance Data.ToHeaders DeleteDestination where
  toHeaders :: DeleteDestination -> [Header]
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 -> [Header]
Data.=# ( ByteString
"Logs_20140328.DeleteDestination" ::
                          Prelude.ByteString
                      ),
            HeaderName
"Content-Type"
              forall a. ToHeader a => HeaderName -> a -> [Header]
Data.=# ( ByteString
"application/x-amz-json-1.1" ::
                          Prelude.ByteString
                      )
          ]
      )

instance Data.ToJSON DeleteDestination where
  toJSON :: DeleteDestination -> Value
toJSON DeleteDestination' {Text
destinationName :: Text
$sel:destinationName:DeleteDestination' :: DeleteDestination -> Text
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ forall a. a -> Maybe a
Prelude.Just
              (Key
"destinationName" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
destinationName)
          ]
      )

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

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

-- | /See:/ 'newDeleteDestinationResponse' smart constructor.
data DeleteDestinationResponse = DeleteDestinationResponse'
  {
  }
  deriving (DeleteDestinationResponse -> DeleteDestinationResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DeleteDestinationResponse -> DeleteDestinationResponse -> Bool
$c/= :: DeleteDestinationResponse -> DeleteDestinationResponse -> Bool
== :: DeleteDestinationResponse -> DeleteDestinationResponse -> Bool
$c== :: DeleteDestinationResponse -> DeleteDestinationResponse -> Bool
Prelude.Eq, ReadPrec [DeleteDestinationResponse]
ReadPrec DeleteDestinationResponse
Int -> ReadS DeleteDestinationResponse
ReadS [DeleteDestinationResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DeleteDestinationResponse]
$creadListPrec :: ReadPrec [DeleteDestinationResponse]
readPrec :: ReadPrec DeleteDestinationResponse
$creadPrec :: ReadPrec DeleteDestinationResponse
readList :: ReadS [DeleteDestinationResponse]
$creadList :: ReadS [DeleteDestinationResponse]
readsPrec :: Int -> ReadS DeleteDestinationResponse
$creadsPrec :: Int -> ReadS DeleteDestinationResponse
Prelude.Read, Int -> DeleteDestinationResponse -> ShowS
[DeleteDestinationResponse] -> ShowS
DeleteDestinationResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DeleteDestinationResponse] -> ShowS
$cshowList :: [DeleteDestinationResponse] -> ShowS
show :: DeleteDestinationResponse -> String
$cshow :: DeleteDestinationResponse -> String
showsPrec :: Int -> DeleteDestinationResponse -> ShowS
$cshowsPrec :: Int -> DeleteDestinationResponse -> ShowS
Prelude.Show, forall x.
Rep DeleteDestinationResponse x -> DeleteDestinationResponse
forall x.
DeleteDestinationResponse -> Rep DeleteDestinationResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DeleteDestinationResponse x -> DeleteDestinationResponse
$cfrom :: forall x.
DeleteDestinationResponse -> Rep DeleteDestinationResponse x
Prelude.Generic)

-- |
-- Create a value of 'DeleteDestinationResponse' 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.
newDeleteDestinationResponse ::
  DeleteDestinationResponse
newDeleteDestinationResponse :: DeleteDestinationResponse
newDeleteDestinationResponse =
  DeleteDestinationResponse
DeleteDestinationResponse'

instance Prelude.NFData DeleteDestinationResponse where
  rnf :: DeleteDestinationResponse -> ()
rnf DeleteDestinationResponse
_ = ()