{-# 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.Organizations.LeaveOrganization
(
LeaveOrganization (..),
newLeaveOrganization,
LeaveOrganizationResponse (..),
newLeaveOrganizationResponse,
)
where
import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.Organizations.Types
import qualified Amazonka.Prelude as Prelude
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response
data LeaveOrganization = LeaveOrganization'
{
}
deriving (LeaveOrganization -> LeaveOrganization -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: LeaveOrganization -> LeaveOrganization -> Bool
$c/= :: LeaveOrganization -> LeaveOrganization -> Bool
== :: LeaveOrganization -> LeaveOrganization -> Bool
$c== :: LeaveOrganization -> LeaveOrganization -> Bool
Prelude.Eq, ReadPrec [LeaveOrganization]
ReadPrec LeaveOrganization
Int -> ReadS LeaveOrganization
ReadS [LeaveOrganization]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [LeaveOrganization]
$creadListPrec :: ReadPrec [LeaveOrganization]
readPrec :: ReadPrec LeaveOrganization
$creadPrec :: ReadPrec LeaveOrganization
readList :: ReadS [LeaveOrganization]
$creadList :: ReadS [LeaveOrganization]
readsPrec :: Int -> ReadS LeaveOrganization
$creadsPrec :: Int -> ReadS LeaveOrganization
Prelude.Read, Int -> LeaveOrganization -> ShowS
[LeaveOrganization] -> ShowS
LeaveOrganization -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [LeaveOrganization] -> ShowS
$cshowList :: [LeaveOrganization] -> ShowS
show :: LeaveOrganization -> String
$cshow :: LeaveOrganization -> String
showsPrec :: Int -> LeaveOrganization -> ShowS
$cshowsPrec :: Int -> LeaveOrganization -> ShowS
Prelude.Show, forall x. Rep LeaveOrganization x -> LeaveOrganization
forall x. LeaveOrganization -> Rep LeaveOrganization x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep LeaveOrganization x -> LeaveOrganization
$cfrom :: forall x. LeaveOrganization -> Rep LeaveOrganization x
Prelude.Generic)
newLeaveOrganization ::
LeaveOrganization
newLeaveOrganization :: LeaveOrganization
newLeaveOrganization = LeaveOrganization
LeaveOrganization'
instance Core.AWSRequest LeaveOrganization where
type
AWSResponse LeaveOrganization =
LeaveOrganizationResponse
request :: (Service -> Service)
-> LeaveOrganization -> Request LeaveOrganization
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 LeaveOrganization
-> ClientResponse ClientBody
-> m (Either
Error (ClientResponse (AWSResponse LeaveOrganization)))
response =
forall (m :: * -> *) a.
MonadResource m =>
AWSResponse a
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveNull LeaveOrganizationResponse
LeaveOrganizationResponse'
instance Prelude.Hashable LeaveOrganization where
hashWithSalt :: Int -> LeaveOrganization -> Int
hashWithSalt Int
_salt LeaveOrganization
_ =
Int
_salt forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` ()
instance Prelude.NFData LeaveOrganization where
rnf :: LeaveOrganization -> ()
rnf LeaveOrganization
_ = ()
instance Data.ToHeaders LeaveOrganization where
toHeaders :: LeaveOrganization -> [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
"AWSOrganizationsV20161128.LeaveOrganization" ::
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 LeaveOrganization where
toJSON :: LeaveOrganization -> Value
toJSON = forall a b. a -> b -> a
Prelude.const (Object -> Value
Data.Object forall a. Monoid a => a
Prelude.mempty)
instance Data.ToPath LeaveOrganization where
toPath :: LeaveOrganization -> ByteString
toPath = forall a b. a -> b -> a
Prelude.const ByteString
"/"
instance Data.ToQuery LeaveOrganization where
toQuery :: LeaveOrganization -> QueryString
toQuery = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty
data LeaveOrganizationResponse = LeaveOrganizationResponse'
{
}
deriving (LeaveOrganizationResponse -> LeaveOrganizationResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: LeaveOrganizationResponse -> LeaveOrganizationResponse -> Bool
$c/= :: LeaveOrganizationResponse -> LeaveOrganizationResponse -> Bool
== :: LeaveOrganizationResponse -> LeaveOrganizationResponse -> Bool
$c== :: LeaveOrganizationResponse -> LeaveOrganizationResponse -> Bool
Prelude.Eq, ReadPrec [LeaveOrganizationResponse]
ReadPrec LeaveOrganizationResponse
Int -> ReadS LeaveOrganizationResponse
ReadS [LeaveOrganizationResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [LeaveOrganizationResponse]
$creadListPrec :: ReadPrec [LeaveOrganizationResponse]
readPrec :: ReadPrec LeaveOrganizationResponse
$creadPrec :: ReadPrec LeaveOrganizationResponse
readList :: ReadS [LeaveOrganizationResponse]
$creadList :: ReadS [LeaveOrganizationResponse]
readsPrec :: Int -> ReadS LeaveOrganizationResponse
$creadsPrec :: Int -> ReadS LeaveOrganizationResponse
Prelude.Read, Int -> LeaveOrganizationResponse -> ShowS
[LeaveOrganizationResponse] -> ShowS
LeaveOrganizationResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [LeaveOrganizationResponse] -> ShowS
$cshowList :: [LeaveOrganizationResponse] -> ShowS
show :: LeaveOrganizationResponse -> String
$cshow :: LeaveOrganizationResponse -> String
showsPrec :: Int -> LeaveOrganizationResponse -> ShowS
$cshowsPrec :: Int -> LeaveOrganizationResponse -> ShowS
Prelude.Show, forall x.
Rep LeaveOrganizationResponse x -> LeaveOrganizationResponse
forall x.
LeaveOrganizationResponse -> Rep LeaveOrganizationResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep LeaveOrganizationResponse x -> LeaveOrganizationResponse
$cfrom :: forall x.
LeaveOrganizationResponse -> Rep LeaveOrganizationResponse x
Prelude.Generic)
newLeaveOrganizationResponse ::
LeaveOrganizationResponse
newLeaveOrganizationResponse :: LeaveOrganizationResponse
newLeaveOrganizationResponse =
LeaveOrganizationResponse
LeaveOrganizationResponse'
instance Prelude.NFData LeaveOrganizationResponse where
rnf :: LeaveOrganizationResponse -> ()
rnf LeaveOrganizationResponse
_ = ()