{-# 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.Storage.Channels.Stop
(
ChannelsStopResource
, channelsStop
, ChannelsStop
, csPayload
) where
import Network.Google.Prelude
import Network.Google.Storage.Types
type ChannelsStopResource =
"storage" :>
"v1" :>
"channels" :>
"stop" :>
QueryParam "alt" AltJSON :>
ReqBody '[JSON] Channel :> Post '[JSON] ()
newtype ChannelsStop = ChannelsStop'
{ _csPayload :: Channel
} deriving (Eq,Show,Data,Typeable,Generic)
channelsStop
:: Channel
-> ChannelsStop
channelsStop pCsPayload_ =
ChannelsStop'
{ _csPayload = pCsPayload_
}
csPayload :: Lens' ChannelsStop Channel
csPayload
= lens _csPayload (\ s a -> s{_csPayload = a})
instance GoogleRequest ChannelsStop where
type Rs ChannelsStop = ()
type Scopes ChannelsStop =
'["https://www.googleapis.com/auth/cloud-platform",
"https://www.googleapis.com/auth/cloud-platform.read-only",
"https://www.googleapis.com/auth/devstorage.full_control",
"https://www.googleapis.com/auth/devstorage.read_only",
"https://www.googleapis.com/auth/devstorage.read_write"]
requestClient ChannelsStop'{..}
= go (Just AltJSON) _csPayload storageService
where go
= buildClient (Proxy :: Proxy ChannelsStopResource)
mempty