{-# 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.ChimeSdkVoice.DeleteVoiceConnectorProxy
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- -- | Undocumented operation.
module Amazonka.ChimeSdkVoice.DeleteVoiceConnectorProxy
  ( -- * Creating a Request
    DeleteVoiceConnectorProxy (..),
    newDeleteVoiceConnectorProxy,

    -- * Request Lenses
    deleteVoiceConnectorProxy_voiceConnectorId,

    -- * Destructuring the Response
    DeleteVoiceConnectorProxyResponse (..),
    newDeleteVoiceConnectorProxyResponse,
  )
where

import Amazonka.ChimeSdkVoice.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:/ 'newDeleteVoiceConnectorProxy' smart constructor.
data DeleteVoiceConnectorProxy = DeleteVoiceConnectorProxy'
  { DeleteVoiceConnectorProxy -> Text
voiceConnectorId :: Prelude.Text
  }
  deriving (DeleteVoiceConnectorProxy -> DeleteVoiceConnectorProxy -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DeleteVoiceConnectorProxy -> DeleteVoiceConnectorProxy -> Bool
$c/= :: DeleteVoiceConnectorProxy -> DeleteVoiceConnectorProxy -> Bool
== :: DeleteVoiceConnectorProxy -> DeleteVoiceConnectorProxy -> Bool
$c== :: DeleteVoiceConnectorProxy -> DeleteVoiceConnectorProxy -> Bool
Prelude.Eq, ReadPrec [DeleteVoiceConnectorProxy]
ReadPrec DeleteVoiceConnectorProxy
Int -> ReadS DeleteVoiceConnectorProxy
ReadS [DeleteVoiceConnectorProxy]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DeleteVoiceConnectorProxy]
$creadListPrec :: ReadPrec [DeleteVoiceConnectorProxy]
readPrec :: ReadPrec DeleteVoiceConnectorProxy
$creadPrec :: ReadPrec DeleteVoiceConnectorProxy
readList :: ReadS [DeleteVoiceConnectorProxy]
$creadList :: ReadS [DeleteVoiceConnectorProxy]
readsPrec :: Int -> ReadS DeleteVoiceConnectorProxy
$creadsPrec :: Int -> ReadS DeleteVoiceConnectorProxy
Prelude.Read, Int -> DeleteVoiceConnectorProxy -> ShowS
[DeleteVoiceConnectorProxy] -> ShowS
DeleteVoiceConnectorProxy -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DeleteVoiceConnectorProxy] -> ShowS
$cshowList :: [DeleteVoiceConnectorProxy] -> ShowS
show :: DeleteVoiceConnectorProxy -> String
$cshow :: DeleteVoiceConnectorProxy -> String
showsPrec :: Int -> DeleteVoiceConnectorProxy -> ShowS
$cshowsPrec :: Int -> DeleteVoiceConnectorProxy -> ShowS
Prelude.Show, forall x.
Rep DeleteVoiceConnectorProxy x -> DeleteVoiceConnectorProxy
forall x.
DeleteVoiceConnectorProxy -> Rep DeleteVoiceConnectorProxy x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DeleteVoiceConnectorProxy x -> DeleteVoiceConnectorProxy
$cfrom :: forall x.
DeleteVoiceConnectorProxy -> Rep DeleteVoiceConnectorProxy x
Prelude.Generic)

-- |
-- Create a value of 'DeleteVoiceConnectorProxy' 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:
--
-- 'voiceConnectorId', 'deleteVoiceConnectorProxy_voiceConnectorId' - Undocumented member.
newDeleteVoiceConnectorProxy ::
  -- | 'voiceConnectorId'
  Prelude.Text ->
  DeleteVoiceConnectorProxy
newDeleteVoiceConnectorProxy :: Text -> DeleteVoiceConnectorProxy
newDeleteVoiceConnectorProxy Text
pVoiceConnectorId_ =
  DeleteVoiceConnectorProxy'
    { $sel:voiceConnectorId:DeleteVoiceConnectorProxy' :: Text
voiceConnectorId =
        Text
pVoiceConnectorId_
    }

-- | Undocumented member.
deleteVoiceConnectorProxy_voiceConnectorId :: Lens.Lens' DeleteVoiceConnectorProxy Prelude.Text
deleteVoiceConnectorProxy_voiceConnectorId :: Lens' DeleteVoiceConnectorProxy Text
deleteVoiceConnectorProxy_voiceConnectorId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeleteVoiceConnectorProxy' {Text
voiceConnectorId :: Text
$sel:voiceConnectorId:DeleteVoiceConnectorProxy' :: DeleteVoiceConnectorProxy -> Text
voiceConnectorId} -> Text
voiceConnectorId) (\s :: DeleteVoiceConnectorProxy
s@DeleteVoiceConnectorProxy' {} Text
a -> DeleteVoiceConnectorProxy
s {$sel:voiceConnectorId:DeleteVoiceConnectorProxy' :: Text
voiceConnectorId = Text
a} :: DeleteVoiceConnectorProxy)

instance Core.AWSRequest DeleteVoiceConnectorProxy where
  type
    AWSResponse DeleteVoiceConnectorProxy =
      DeleteVoiceConnectorProxyResponse
  request :: (Service -> Service)
-> DeleteVoiceConnectorProxy -> Request DeleteVoiceConnectorProxy
request Service -> Service
overrides =
    forall a. ToRequest a => Service -> a -> Request a
Request.delete (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy DeleteVoiceConnectorProxy
-> ClientResponse ClientBody
-> m (Either
        Error (ClientResponse (AWSResponse DeleteVoiceConnectorProxy)))
response =
    forall (m :: * -> *) a.
MonadResource m =>
AWSResponse a
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveNull
      DeleteVoiceConnectorProxyResponse
DeleteVoiceConnectorProxyResponse'

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

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

instance Data.ToHeaders DeleteVoiceConnectorProxy where
  toHeaders :: DeleteVoiceConnectorProxy -> [Header]
toHeaders = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty

instance Data.ToPath DeleteVoiceConnectorProxy where
  toPath :: DeleteVoiceConnectorProxy -> ByteString
toPath DeleteVoiceConnectorProxy' {Text
voiceConnectorId :: Text
$sel:voiceConnectorId:DeleteVoiceConnectorProxy' :: DeleteVoiceConnectorProxy -> Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"/voice-connectors/",
        forall a. ToByteString a => a -> ByteString
Data.toBS Text
voiceConnectorId,
        ByteString
"/programmable-numbers/proxy"
      ]

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

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

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

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