{-# 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.ChimeSDKIdentity.DeregisterAppInstanceUserEndpoint
-- 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 an @AppInstanceUserEndpoint@.
module Amazonka.ChimeSDKIdentity.DeregisterAppInstanceUserEndpoint
  ( -- * Creating a Request
    DeregisterAppInstanceUserEndpoint (..),
    newDeregisterAppInstanceUserEndpoint,

    -- * Request Lenses
    deregisterAppInstanceUserEndpoint_appInstanceUserArn,
    deregisterAppInstanceUserEndpoint_endpointId,

    -- * Destructuring the Response
    DeregisterAppInstanceUserEndpointResponse (..),
    newDeregisterAppInstanceUserEndpointResponse,
  )
where

import Amazonka.ChimeSDKIdentity.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:/ 'newDeregisterAppInstanceUserEndpoint' smart constructor.
data DeregisterAppInstanceUserEndpoint = DeregisterAppInstanceUserEndpoint'
  { -- | The ARN of the @AppInstanceUser@.
    DeregisterAppInstanceUserEndpoint -> Sensitive Text
appInstanceUserArn :: Data.Sensitive Prelude.Text,
    -- | The unique identifier of the @AppInstanceUserEndpoint@.
    DeregisterAppInstanceUserEndpoint -> Sensitive Text
endpointId :: Data.Sensitive Prelude.Text
  }
  deriving (DeregisterAppInstanceUserEndpoint
-> DeregisterAppInstanceUserEndpoint -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DeregisterAppInstanceUserEndpoint
-> DeregisterAppInstanceUserEndpoint -> Bool
$c/= :: DeregisterAppInstanceUserEndpoint
-> DeregisterAppInstanceUserEndpoint -> Bool
== :: DeregisterAppInstanceUserEndpoint
-> DeregisterAppInstanceUserEndpoint -> Bool
$c== :: DeregisterAppInstanceUserEndpoint
-> DeregisterAppInstanceUserEndpoint -> Bool
Prelude.Eq, Int -> DeregisterAppInstanceUserEndpoint -> ShowS
[DeregisterAppInstanceUserEndpoint] -> ShowS
DeregisterAppInstanceUserEndpoint -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DeregisterAppInstanceUserEndpoint] -> ShowS
$cshowList :: [DeregisterAppInstanceUserEndpoint] -> ShowS
show :: DeregisterAppInstanceUserEndpoint -> String
$cshow :: DeregisterAppInstanceUserEndpoint -> String
showsPrec :: Int -> DeregisterAppInstanceUserEndpoint -> ShowS
$cshowsPrec :: Int -> DeregisterAppInstanceUserEndpoint -> ShowS
Prelude.Show, forall x.
Rep DeregisterAppInstanceUserEndpoint x
-> DeregisterAppInstanceUserEndpoint
forall x.
DeregisterAppInstanceUserEndpoint
-> Rep DeregisterAppInstanceUserEndpoint x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DeregisterAppInstanceUserEndpoint x
-> DeregisterAppInstanceUserEndpoint
$cfrom :: forall x.
DeregisterAppInstanceUserEndpoint
-> Rep DeregisterAppInstanceUserEndpoint x
Prelude.Generic)

-- |
-- Create a value of 'DeregisterAppInstanceUserEndpoint' 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:
--
-- 'appInstanceUserArn', 'deregisterAppInstanceUserEndpoint_appInstanceUserArn' - The ARN of the @AppInstanceUser@.
--
-- 'endpointId', 'deregisterAppInstanceUserEndpoint_endpointId' - The unique identifier of the @AppInstanceUserEndpoint@.
newDeregisterAppInstanceUserEndpoint ::
  -- | 'appInstanceUserArn'
  Prelude.Text ->
  -- | 'endpointId'
  Prelude.Text ->
  DeregisterAppInstanceUserEndpoint
newDeregisterAppInstanceUserEndpoint :: Text -> Text -> DeregisterAppInstanceUserEndpoint
newDeregisterAppInstanceUserEndpoint
  Text
pAppInstanceUserArn_
  Text
pEndpointId_ =
    DeregisterAppInstanceUserEndpoint'
      { $sel:appInstanceUserArn:DeregisterAppInstanceUserEndpoint' :: Sensitive Text
appInstanceUserArn =
          forall a. Iso' (Sensitive a) a
Data._Sensitive
            forall t b. AReview t b -> b -> t
Lens.# Text
pAppInstanceUserArn_,
        $sel:endpointId:DeregisterAppInstanceUserEndpoint' :: Sensitive Text
endpointId =
          forall a. Iso' (Sensitive a) a
Data._Sensitive forall t b. AReview t b -> b -> t
Lens.# Text
pEndpointId_
      }

-- | The ARN of the @AppInstanceUser@.
deregisterAppInstanceUserEndpoint_appInstanceUserArn :: Lens.Lens' DeregisterAppInstanceUserEndpoint Prelude.Text
deregisterAppInstanceUserEndpoint_appInstanceUserArn :: Lens' DeregisterAppInstanceUserEndpoint Text
deregisterAppInstanceUserEndpoint_appInstanceUserArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeregisterAppInstanceUserEndpoint' {Sensitive Text
appInstanceUserArn :: Sensitive Text
$sel:appInstanceUserArn:DeregisterAppInstanceUserEndpoint' :: DeregisterAppInstanceUserEndpoint -> Sensitive Text
appInstanceUserArn} -> Sensitive Text
appInstanceUserArn) (\s :: DeregisterAppInstanceUserEndpoint
s@DeregisterAppInstanceUserEndpoint' {} Sensitive Text
a -> DeregisterAppInstanceUserEndpoint
s {$sel:appInstanceUserArn:DeregisterAppInstanceUserEndpoint' :: Sensitive Text
appInstanceUserArn = Sensitive Text
a} :: DeregisterAppInstanceUserEndpoint) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall a. Iso' (Sensitive a) a
Data._Sensitive

-- | The unique identifier of the @AppInstanceUserEndpoint@.
deregisterAppInstanceUserEndpoint_endpointId :: Lens.Lens' DeregisterAppInstanceUserEndpoint Prelude.Text
deregisterAppInstanceUserEndpoint_endpointId :: Lens' DeregisterAppInstanceUserEndpoint Text
deregisterAppInstanceUserEndpoint_endpointId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeregisterAppInstanceUserEndpoint' {Sensitive Text
endpointId :: Sensitive Text
$sel:endpointId:DeregisterAppInstanceUserEndpoint' :: DeregisterAppInstanceUserEndpoint -> Sensitive Text
endpointId} -> Sensitive Text
endpointId) (\s :: DeregisterAppInstanceUserEndpoint
s@DeregisterAppInstanceUserEndpoint' {} Sensitive Text
a -> DeregisterAppInstanceUserEndpoint
s {$sel:endpointId:DeregisterAppInstanceUserEndpoint' :: Sensitive Text
endpointId = Sensitive Text
a} :: DeregisterAppInstanceUserEndpoint) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall a. Iso' (Sensitive a) a
Data._Sensitive

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

instance
  Prelude.Hashable
    DeregisterAppInstanceUserEndpoint
  where
  hashWithSalt :: Int -> DeregisterAppInstanceUserEndpoint -> Int
hashWithSalt
    Int
_salt
    DeregisterAppInstanceUserEndpoint' {Sensitive Text
endpointId :: Sensitive Text
appInstanceUserArn :: Sensitive Text
$sel:endpointId:DeregisterAppInstanceUserEndpoint' :: DeregisterAppInstanceUserEndpoint -> Sensitive Text
$sel:appInstanceUserArn:DeregisterAppInstanceUserEndpoint' :: DeregisterAppInstanceUserEndpoint -> Sensitive Text
..} =
      Int
_salt
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Sensitive Text
appInstanceUserArn
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Sensitive Text
endpointId

instance
  Prelude.NFData
    DeregisterAppInstanceUserEndpoint
  where
  rnf :: DeregisterAppInstanceUserEndpoint -> ()
rnf DeregisterAppInstanceUserEndpoint' {Sensitive Text
endpointId :: Sensitive Text
appInstanceUserArn :: Sensitive Text
$sel:endpointId:DeregisterAppInstanceUserEndpoint' :: DeregisterAppInstanceUserEndpoint -> Sensitive Text
$sel:appInstanceUserArn:DeregisterAppInstanceUserEndpoint' :: DeregisterAppInstanceUserEndpoint -> Sensitive Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Sensitive Text
appInstanceUserArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Sensitive Text
endpointId

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

instance
  Data.ToPath
    DeregisterAppInstanceUserEndpoint
  where
  toPath :: DeregisterAppInstanceUserEndpoint -> ByteString
toPath DeregisterAppInstanceUserEndpoint' {Sensitive Text
endpointId :: Sensitive Text
appInstanceUserArn :: Sensitive Text
$sel:endpointId:DeregisterAppInstanceUserEndpoint' :: DeregisterAppInstanceUserEndpoint -> Sensitive Text
$sel:appInstanceUserArn:DeregisterAppInstanceUserEndpoint' :: DeregisterAppInstanceUserEndpoint -> Sensitive Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"/app-instance-users/",
        forall a. ToByteString a => a -> ByteString
Data.toBS Sensitive Text
appInstanceUserArn,
        ByteString
"/endpoints/",
        forall a. ToByteString a => a -> ByteString
Data.toBS Sensitive Text
endpointId
      ]

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

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

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

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