{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeOperators #-}
{-# OPTIONS_GHC -fno-warn-duplicate-exports #-}
{-# OPTIONS_GHC -fno-warn-unused-binds #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.Resource.Reseller.Subscriptions.Suspend
(
SubscriptionsSuspendResource
, subscriptionsSuspend
, SubscriptionsSuspend
, ssCustomerId
, ssSubscriptionId
) where
import Network.Google.AppsReseller.Types
import Network.Google.Prelude
type SubscriptionsSuspendResource =
"apps" :>
"reseller" :>
"v1" :>
"customers" :>
Capture "customerId" Text :>
"subscriptions" :>
Capture "subscriptionId" Text :>
"suspend" :>
QueryParam "alt" AltJSON :> Post '[JSON] Subscription
data SubscriptionsSuspend = SubscriptionsSuspend'
{ _ssCustomerId :: !Text
, _ssSubscriptionId :: !Text
} deriving (Eq,Show,Data,Typeable,Generic)
subscriptionsSuspend
:: Text
-> Text
-> SubscriptionsSuspend
subscriptionsSuspend pSsCustomerId_ pSsSubscriptionId_ =
SubscriptionsSuspend'
{ _ssCustomerId = pSsCustomerId_
, _ssSubscriptionId = pSsSubscriptionId_
}
ssCustomerId :: Lens' SubscriptionsSuspend Text
ssCustomerId
= lens _ssCustomerId (\ s a -> s{_ssCustomerId = a})
ssSubscriptionId :: Lens' SubscriptionsSuspend Text
ssSubscriptionId
= lens _ssSubscriptionId
(\ s a -> s{_ssSubscriptionId = a})
instance GoogleRequest SubscriptionsSuspend where
type Rs SubscriptionsSuspend = Subscription
type Scopes SubscriptionsSuspend =
'["https://www.googleapis.com/auth/apps.order"]
requestClient SubscriptionsSuspend'{..}
= go _ssCustomerId _ssSubscriptionId (Just AltJSON)
appsResellerService
where go
= buildClient
(Proxy :: Proxy SubscriptionsSuspendResource)
mempty