{-# 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.Slides.Presentations.Get
(
PresentationsGetResource
, presentationsGet
, PresentationsGet
, pgXgafv
, pgUploadProtocol
, pgAccessToken
, pgUploadType
, pgPresentationId
, pgCallback
) where
import Network.Google.Prelude
import Network.Google.Slides.Types
type PresentationsGetResource =
"v1" :>
"presentations" :>
Capture "presentationId" Text :>
QueryParam "$.xgafv" Xgafv :>
QueryParam "upload_protocol" Text :>
QueryParam "access_token" Text :>
QueryParam "uploadType" Text :>
QueryParam "callback" Text :>
QueryParam "alt" AltJSON :> Get '[JSON] Presentation
data PresentationsGet = PresentationsGet'
{ _pgXgafv :: !(Maybe Xgafv)
, _pgUploadProtocol :: !(Maybe Text)
, _pgAccessToken :: !(Maybe Text)
, _pgUploadType :: !(Maybe Text)
, _pgPresentationId :: !Text
, _pgCallback :: !(Maybe Text)
} deriving (Eq,Show,Data,Typeable,Generic)
presentationsGet
:: Text
-> PresentationsGet
presentationsGet pPgPresentationId_ =
PresentationsGet'
{ _pgXgafv = Nothing
, _pgUploadProtocol = Nothing
, _pgAccessToken = Nothing
, _pgUploadType = Nothing
, _pgPresentationId = pPgPresentationId_
, _pgCallback = Nothing
}
pgXgafv :: Lens' PresentationsGet (Maybe Xgafv)
pgXgafv = lens _pgXgafv (\ s a -> s{_pgXgafv = a})
pgUploadProtocol :: Lens' PresentationsGet (Maybe Text)
pgUploadProtocol
= lens _pgUploadProtocol
(\ s a -> s{_pgUploadProtocol = a})
pgAccessToken :: Lens' PresentationsGet (Maybe Text)
pgAccessToken
= lens _pgAccessToken
(\ s a -> s{_pgAccessToken = a})
pgUploadType :: Lens' PresentationsGet (Maybe Text)
pgUploadType
= lens _pgUploadType (\ s a -> s{_pgUploadType = a})
pgPresentationId :: Lens' PresentationsGet Text
pgPresentationId
= lens _pgPresentationId
(\ s a -> s{_pgPresentationId = a})
pgCallback :: Lens' PresentationsGet (Maybe Text)
pgCallback
= lens _pgCallback (\ s a -> s{_pgCallback = a})
instance GoogleRequest PresentationsGet where
type Rs PresentationsGet = Presentation
type Scopes PresentationsGet =
'["https://www.googleapis.com/auth/drive",
"https://www.googleapis.com/auth/drive.file",
"https://www.googleapis.com/auth/drive.readonly",
"https://www.googleapis.com/auth/presentations",
"https://www.googleapis.com/auth/presentations.readonly"]
requestClient PresentationsGet'{..}
= go _pgPresentationId _pgXgafv _pgUploadProtocol
_pgAccessToken
_pgUploadType
_pgCallback
(Just AltJSON)
slidesService
where go
= buildClient
(Proxy :: Proxy PresentationsGetResource)
mempty