{-# 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.OpsWorks.DeleteUserProfile
(
DeleteUserProfile (..),
newDeleteUserProfile,
deleteUserProfile_iamUserArn,
DeleteUserProfileResponse (..),
newDeleteUserProfileResponse,
)
where
import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.OpsWorks.Types
import qualified Amazonka.Prelude as Prelude
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response
data DeleteUserProfile = DeleteUserProfile'
{
DeleteUserProfile -> Text
iamUserArn :: Prelude.Text
}
deriving (DeleteUserProfile -> DeleteUserProfile -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DeleteUserProfile -> DeleteUserProfile -> Bool
$c/= :: DeleteUserProfile -> DeleteUserProfile -> Bool
== :: DeleteUserProfile -> DeleteUserProfile -> Bool
$c== :: DeleteUserProfile -> DeleteUserProfile -> Bool
Prelude.Eq, ReadPrec [DeleteUserProfile]
ReadPrec DeleteUserProfile
Int -> ReadS DeleteUserProfile
ReadS [DeleteUserProfile]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DeleteUserProfile]
$creadListPrec :: ReadPrec [DeleteUserProfile]
readPrec :: ReadPrec DeleteUserProfile
$creadPrec :: ReadPrec DeleteUserProfile
readList :: ReadS [DeleteUserProfile]
$creadList :: ReadS [DeleteUserProfile]
readsPrec :: Int -> ReadS DeleteUserProfile
$creadsPrec :: Int -> ReadS DeleteUserProfile
Prelude.Read, Int -> DeleteUserProfile -> ShowS
[DeleteUserProfile] -> ShowS
DeleteUserProfile -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DeleteUserProfile] -> ShowS
$cshowList :: [DeleteUserProfile] -> ShowS
show :: DeleteUserProfile -> String
$cshow :: DeleteUserProfile -> String
showsPrec :: Int -> DeleteUserProfile -> ShowS
$cshowsPrec :: Int -> DeleteUserProfile -> ShowS
Prelude.Show, forall x. Rep DeleteUserProfile x -> DeleteUserProfile
forall x. DeleteUserProfile -> Rep DeleteUserProfile x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep DeleteUserProfile x -> DeleteUserProfile
$cfrom :: forall x. DeleteUserProfile -> Rep DeleteUserProfile x
Prelude.Generic)
newDeleteUserProfile ::
Prelude.Text ->
DeleteUserProfile
newDeleteUserProfile :: Text -> DeleteUserProfile
newDeleteUserProfile Text
pIamUserArn_ =
DeleteUserProfile' {$sel:iamUserArn:DeleteUserProfile' :: Text
iamUserArn = Text
pIamUserArn_}
deleteUserProfile_iamUserArn :: Lens.Lens' DeleteUserProfile Prelude.Text
deleteUserProfile_iamUserArn :: Lens' DeleteUserProfile Text
deleteUserProfile_iamUserArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\DeleteUserProfile' {Text
iamUserArn :: Text
$sel:iamUserArn:DeleteUserProfile' :: DeleteUserProfile -> Text
iamUserArn} -> Text
iamUserArn) (\s :: DeleteUserProfile
s@DeleteUserProfile' {} Text
a -> DeleteUserProfile
s {$sel:iamUserArn:DeleteUserProfile' :: Text
iamUserArn = Text
a} :: DeleteUserProfile)
instance Core.AWSRequest DeleteUserProfile where
type
AWSResponse DeleteUserProfile =
DeleteUserProfileResponse
request :: (Service -> Service)
-> DeleteUserProfile -> Request DeleteUserProfile
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 DeleteUserProfile
-> ClientResponse ClientBody
-> m (Either
Error (ClientResponse (AWSResponse DeleteUserProfile)))
response =
forall (m :: * -> *) a.
MonadResource m =>
AWSResponse a
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveNull DeleteUserProfileResponse
DeleteUserProfileResponse'
instance Prelude.Hashable DeleteUserProfile where
hashWithSalt :: Int -> DeleteUserProfile -> Int
hashWithSalt Int
_salt DeleteUserProfile' {Text
iamUserArn :: Text
$sel:iamUserArn:DeleteUserProfile' :: DeleteUserProfile -> Text
..} =
Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
iamUserArn
instance Prelude.NFData DeleteUserProfile where
rnf :: DeleteUserProfile -> ()
rnf DeleteUserProfile' {Text
iamUserArn :: Text
$sel:iamUserArn:DeleteUserProfile' :: DeleteUserProfile -> Text
..} = forall a. NFData a => a -> ()
Prelude.rnf Text
iamUserArn
instance Data.ToHeaders DeleteUserProfile where
toHeaders :: DeleteUserProfile -> [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
"OpsWorks_20130218.DeleteUserProfile" ::
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 DeleteUserProfile where
toJSON :: DeleteUserProfile -> Value
toJSON DeleteUserProfile' {Text
iamUserArn :: Text
$sel:iamUserArn:DeleteUserProfile' :: DeleteUserProfile -> Text
..} =
[Pair] -> Value
Data.object
( forall a. [Maybe a] -> [a]
Prelude.catMaybes
[forall a. a -> Maybe a
Prelude.Just (Key
"IamUserArn" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
iamUserArn)]
)
instance Data.ToPath DeleteUserProfile where
toPath :: DeleteUserProfile -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/"
instance Data.ToQuery DeleteUserProfile where
toQuery :: DeleteUserProfile -> QueryString
toQuery = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty
data DeleteUserProfileResponse = DeleteUserProfileResponse'
{
}
deriving (DeleteUserProfileResponse -> DeleteUserProfileResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DeleteUserProfileResponse -> DeleteUserProfileResponse -> Bool
$c/= :: DeleteUserProfileResponse -> DeleteUserProfileResponse -> Bool
== :: DeleteUserProfileResponse -> DeleteUserProfileResponse -> Bool
$c== :: DeleteUserProfileResponse -> DeleteUserProfileResponse -> Bool
Prelude.Eq, ReadPrec [DeleteUserProfileResponse]
ReadPrec DeleteUserProfileResponse
Int -> ReadS DeleteUserProfileResponse
ReadS [DeleteUserProfileResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [DeleteUserProfileResponse]
$creadListPrec :: ReadPrec [DeleteUserProfileResponse]
readPrec :: ReadPrec DeleteUserProfileResponse
$creadPrec :: ReadPrec DeleteUserProfileResponse
readList :: ReadS [DeleteUserProfileResponse]
$creadList :: ReadS [DeleteUserProfileResponse]
readsPrec :: Int -> ReadS DeleteUserProfileResponse
$creadsPrec :: Int -> ReadS DeleteUserProfileResponse
Prelude.Read, Int -> DeleteUserProfileResponse -> ShowS
[DeleteUserProfileResponse] -> ShowS
DeleteUserProfileResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [DeleteUserProfileResponse] -> ShowS
$cshowList :: [DeleteUserProfileResponse] -> ShowS
show :: DeleteUserProfileResponse -> String
$cshow :: DeleteUserProfileResponse -> String
showsPrec :: Int -> DeleteUserProfileResponse -> ShowS
$cshowsPrec :: Int -> DeleteUserProfileResponse -> ShowS
Prelude.Show, forall x.
Rep DeleteUserProfileResponse x -> DeleteUserProfileResponse
forall x.
DeleteUserProfileResponse -> Rep DeleteUserProfileResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep DeleteUserProfileResponse x -> DeleteUserProfileResponse
$cfrom :: forall x.
DeleteUserProfileResponse -> Rep DeleteUserProfileResponse x
Prelude.Generic)
newDeleteUserProfileResponse ::
DeleteUserProfileResponse
newDeleteUserProfileResponse :: DeleteUserProfileResponse
newDeleteUserProfileResponse =
DeleteUserProfileResponse
DeleteUserProfileResponse'
instance Prelude.NFData DeleteUserProfileResponse where
rnf :: DeleteUserProfileResponse -> ()
rnf DeleteUserProfileResponse
_ = ()