{-# 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 #-}
module Amazonka.WellArchitected.UntagResource
(
UntagResource (..),
newUntagResource,
untagResource_workloadArn,
untagResource_tagKeys,
UntagResourceResponse (..),
newUntagResourceResponse,
untagResourceResponse_httpStatus,
)
where
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
import Amazonka.WellArchitected.Types
data UntagResource = UntagResource'
{ UntagResource -> Text
workloadArn :: Prelude.Text,
UntagResource -> NonEmpty Text
tagKeys :: Prelude.NonEmpty Prelude.Text
}
deriving (UntagResource -> UntagResource -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UntagResource -> UntagResource -> Bool
$c/= :: UntagResource -> UntagResource -> Bool
== :: UntagResource -> UntagResource -> Bool
$c== :: UntagResource -> UntagResource -> Bool
Prelude.Eq, ReadPrec [UntagResource]
ReadPrec UntagResource
Int -> ReadS UntagResource
ReadS [UntagResource]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [UntagResource]
$creadListPrec :: ReadPrec [UntagResource]
readPrec :: ReadPrec UntagResource
$creadPrec :: ReadPrec UntagResource
readList :: ReadS [UntagResource]
$creadList :: ReadS [UntagResource]
readsPrec :: Int -> ReadS UntagResource
$creadsPrec :: Int -> ReadS UntagResource
Prelude.Read, Int -> UntagResource -> ShowS
[UntagResource] -> ShowS
UntagResource -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UntagResource] -> ShowS
$cshowList :: [UntagResource] -> ShowS
show :: UntagResource -> String
$cshow :: UntagResource -> String
showsPrec :: Int -> UntagResource -> ShowS
$cshowsPrec :: Int -> UntagResource -> ShowS
Prelude.Show, forall x. Rep UntagResource x -> UntagResource
forall x. UntagResource -> Rep UntagResource x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep UntagResource x -> UntagResource
$cfrom :: forall x. UntagResource -> Rep UntagResource x
Prelude.Generic)
newUntagResource ::
Prelude.Text ->
Prelude.NonEmpty Prelude.Text ->
UntagResource
newUntagResource :: Text -> NonEmpty Text -> UntagResource
newUntagResource Text
pWorkloadArn_ NonEmpty Text
pTagKeys_ =
UntagResource'
{ $sel:workloadArn:UntagResource' :: Text
workloadArn = Text
pWorkloadArn_,
$sel:tagKeys:UntagResource' :: NonEmpty Text
tagKeys = forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced forall t b. AReview t b -> b -> t
Lens.# NonEmpty Text
pTagKeys_
}
untagResource_workloadArn :: Lens.Lens' UntagResource Prelude.Text
untagResource_workloadArn :: Lens' UntagResource Text
untagResource_workloadArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UntagResource' {Text
workloadArn :: Text
$sel:workloadArn:UntagResource' :: UntagResource -> Text
workloadArn} -> Text
workloadArn) (\s :: UntagResource
s@UntagResource' {} Text
a -> UntagResource
s {$sel:workloadArn:UntagResource' :: Text
workloadArn = Text
a} :: UntagResource)
untagResource_tagKeys :: Lens.Lens' UntagResource (Prelude.NonEmpty Prelude.Text)
untagResource_tagKeys :: Lens' UntagResource (NonEmpty Text)
untagResource_tagKeys = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UntagResource' {NonEmpty Text
tagKeys :: NonEmpty Text
$sel:tagKeys:UntagResource' :: UntagResource -> NonEmpty Text
tagKeys} -> NonEmpty Text
tagKeys) (\s :: UntagResource
s@UntagResource' {} NonEmpty Text
a -> UntagResource
s {$sel:tagKeys:UntagResource' :: NonEmpty Text
tagKeys = NonEmpty Text
a} :: UntagResource) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced
instance Core.AWSRequest UntagResource where
type
AWSResponse UntagResource =
UntagResourceResponse
request :: (Service -> Service) -> UntagResource -> Request UntagResource
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 UntagResource
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse UntagResource)))
response =
forall (m :: * -> *) a.
MonadResource m =>
(Int -> ResponseHeaders -> () -> Either String (AWSResponse a))
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveEmpty
( \Int
s ResponseHeaders
h ()
x ->
Int -> UntagResourceResponse
UntagResourceResponse'
forall (f :: * -> *) a b. Functor 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 UntagResource where
hashWithSalt :: Int -> UntagResource -> Int
hashWithSalt Int
_salt UntagResource' {NonEmpty Text
Text
tagKeys :: NonEmpty Text
workloadArn :: Text
$sel:tagKeys:UntagResource' :: UntagResource -> NonEmpty Text
$sel:workloadArn:UntagResource' :: UntagResource -> Text
..} =
Int
_salt
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
workloadArn
forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` NonEmpty Text
tagKeys
instance Prelude.NFData UntagResource where
rnf :: UntagResource -> ()
rnf UntagResource' {NonEmpty Text
Text
tagKeys :: NonEmpty Text
workloadArn :: Text
$sel:tagKeys:UntagResource' :: UntagResource -> NonEmpty Text
$sel:workloadArn:UntagResource' :: UntagResource -> Text
..} =
forall a. NFData a => a -> ()
Prelude.rnf Text
workloadArn
seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf NonEmpty Text
tagKeys
instance Data.ToHeaders UntagResource where
toHeaders :: UntagResource -> ResponseHeaders
toHeaders =
forall a b. a -> b -> a
Prelude.const
( forall a. Monoid a => [a] -> a
Prelude.mconcat
[ HeaderName
"Content-Type"
forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"application/x-amz-json-1.1" ::
Prelude.ByteString
)
]
)
instance Data.ToPath UntagResource where
toPath :: UntagResource -> ByteString
toPath UntagResource' {NonEmpty Text
Text
tagKeys :: NonEmpty Text
workloadArn :: Text
$sel:tagKeys:UntagResource' :: UntagResource -> NonEmpty Text
$sel:workloadArn:UntagResource' :: UntagResource -> Text
..} =
forall a. Monoid a => [a] -> a
Prelude.mconcat [ByteString
"/tags/", forall a. ToByteString a => a -> ByteString
Data.toBS Text
workloadArn]
instance Data.ToQuery UntagResource where
toQuery :: UntagResource -> QueryString
toQuery UntagResource' {NonEmpty Text
Text
tagKeys :: NonEmpty Text
workloadArn :: Text
$sel:tagKeys:UntagResource' :: UntagResource -> NonEmpty Text
$sel:workloadArn:UntagResource' :: UntagResource -> Text
..} =
forall a. Monoid a => [a] -> a
Prelude.mconcat
[ByteString
"tagKeys" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: forall a.
(IsList a, ToQuery (Item a)) =>
ByteString -> a -> QueryString
Data.toQueryList ByteString
"member" NonEmpty Text
tagKeys]
data UntagResourceResponse = UntagResourceResponse'
{
UntagResourceResponse -> Int
httpStatus :: Prelude.Int
}
deriving (UntagResourceResponse -> UntagResourceResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UntagResourceResponse -> UntagResourceResponse -> Bool
$c/= :: UntagResourceResponse -> UntagResourceResponse -> Bool
== :: UntagResourceResponse -> UntagResourceResponse -> Bool
$c== :: UntagResourceResponse -> UntagResourceResponse -> Bool
Prelude.Eq, ReadPrec [UntagResourceResponse]
ReadPrec UntagResourceResponse
Int -> ReadS UntagResourceResponse
ReadS [UntagResourceResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [UntagResourceResponse]
$creadListPrec :: ReadPrec [UntagResourceResponse]
readPrec :: ReadPrec UntagResourceResponse
$creadPrec :: ReadPrec UntagResourceResponse
readList :: ReadS [UntagResourceResponse]
$creadList :: ReadS [UntagResourceResponse]
readsPrec :: Int -> ReadS UntagResourceResponse
$creadsPrec :: Int -> ReadS UntagResourceResponse
Prelude.Read, Int -> UntagResourceResponse -> ShowS
[UntagResourceResponse] -> ShowS
UntagResourceResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UntagResourceResponse] -> ShowS
$cshowList :: [UntagResourceResponse] -> ShowS
show :: UntagResourceResponse -> String
$cshow :: UntagResourceResponse -> String
showsPrec :: Int -> UntagResourceResponse -> ShowS
$cshowsPrec :: Int -> UntagResourceResponse -> ShowS
Prelude.Show, forall x. Rep UntagResourceResponse x -> UntagResourceResponse
forall x. UntagResourceResponse -> Rep UntagResourceResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep UntagResourceResponse x -> UntagResourceResponse
$cfrom :: forall x. UntagResourceResponse -> Rep UntagResourceResponse x
Prelude.Generic)
newUntagResourceResponse ::
Prelude.Int ->
UntagResourceResponse
newUntagResourceResponse :: Int -> UntagResourceResponse
newUntagResourceResponse Int
pHttpStatus_ =
UntagResourceResponse' {$sel:httpStatus:UntagResourceResponse' :: Int
httpStatus = Int
pHttpStatus_}
untagResourceResponse_httpStatus :: Lens.Lens' UntagResourceResponse Prelude.Int
untagResourceResponse_httpStatus :: Lens' UntagResourceResponse Int
untagResourceResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UntagResourceResponse' {Int
httpStatus :: Int
$sel:httpStatus:UntagResourceResponse' :: UntagResourceResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: UntagResourceResponse
s@UntagResourceResponse' {} Int
a -> UntagResourceResponse
s {$sel:httpStatus:UntagResourceResponse' :: Int
httpStatus = Int
a} :: UntagResourceResponse)
instance Prelude.NFData UntagResourceResponse where
rnf :: UntagResourceResponse -> ()
rnf UntagResourceResponse' {Int
httpStatus :: Int
$sel:httpStatus:UntagResourceResponse' :: UntagResourceResponse -> Int
..} =
forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus