{-# 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.CloudSearch.Indexing.Datasources.Items.Get
(
IndexingDatasourcesItemsGetResource
, indexingDatasourcesItemsGet
, IndexingDatasourcesItemsGet
, idigXgafv
, idigUploadProtocol
, idigAccessToken
, idigUploadType
, idigConnectorName
, idigName
, idigDebugOptionsEnableDebugging
, idigCallback
) where
import Network.Google.CloudSearch.Types
import Network.Google.Prelude
type IndexingDatasourcesItemsGetResource =
"v1" :>
"indexing" :>
Capture "name" Text :>
QueryParam "$.xgafv" Xgafv :>
QueryParam "upload_protocol" Text :>
QueryParam "access_token" Text :>
QueryParam "uploadType" Text :>
QueryParam "connectorName" Text :>
QueryParam "debugOptions.enableDebugging" Bool :>
QueryParam "callback" Text :>
QueryParam "alt" AltJSON :> Get '[JSON] Item
data IndexingDatasourcesItemsGet = IndexingDatasourcesItemsGet'
{ _idigXgafv :: !(Maybe Xgafv)
, _idigUploadProtocol :: !(Maybe Text)
, _idigAccessToken :: !(Maybe Text)
, _idigUploadType :: !(Maybe Text)
, _idigConnectorName :: !(Maybe Text)
, _idigName :: !Text
, _idigDebugOptionsEnableDebugging :: !(Maybe Bool)
, _idigCallback :: !(Maybe Text)
} deriving (Eq,Show,Data,Typeable,Generic)
indexingDatasourcesItemsGet
:: Text
-> IndexingDatasourcesItemsGet
indexingDatasourcesItemsGet pIdigName_ =
IndexingDatasourcesItemsGet'
{ _idigXgafv = Nothing
, _idigUploadProtocol = Nothing
, _idigAccessToken = Nothing
, _idigUploadType = Nothing
, _idigConnectorName = Nothing
, _idigName = pIdigName_
, _idigDebugOptionsEnableDebugging = Nothing
, _idigCallback = Nothing
}
idigXgafv :: Lens' IndexingDatasourcesItemsGet (Maybe Xgafv)
idigXgafv
= lens _idigXgafv (\ s a -> s{_idigXgafv = a})
idigUploadProtocol :: Lens' IndexingDatasourcesItemsGet (Maybe Text)
idigUploadProtocol
= lens _idigUploadProtocol
(\ s a -> s{_idigUploadProtocol = a})
idigAccessToken :: Lens' IndexingDatasourcesItemsGet (Maybe Text)
idigAccessToken
= lens _idigAccessToken
(\ s a -> s{_idigAccessToken = a})
idigUploadType :: Lens' IndexingDatasourcesItemsGet (Maybe Text)
idigUploadType
= lens _idigUploadType
(\ s a -> s{_idigUploadType = a})
idigConnectorName :: Lens' IndexingDatasourcesItemsGet (Maybe Text)
idigConnectorName
= lens _idigConnectorName
(\ s a -> s{_idigConnectorName = a})
idigName :: Lens' IndexingDatasourcesItemsGet Text
idigName = lens _idigName (\ s a -> s{_idigName = a})
idigDebugOptionsEnableDebugging :: Lens' IndexingDatasourcesItemsGet (Maybe Bool)
idigDebugOptionsEnableDebugging
= lens _idigDebugOptionsEnableDebugging
(\ s a -> s{_idigDebugOptionsEnableDebugging = a})
idigCallback :: Lens' IndexingDatasourcesItemsGet (Maybe Text)
idigCallback
= lens _idigCallback (\ s a -> s{_idigCallback = a})
instance GoogleRequest IndexingDatasourcesItemsGet
where
type Rs IndexingDatasourcesItemsGet = Item
type Scopes IndexingDatasourcesItemsGet =
'["https://www.googleapis.com/auth/cloud_search",
"https://www.googleapis.com/auth/cloud_search.indexing"]
requestClient IndexingDatasourcesItemsGet'{..}
= go _idigName _idigXgafv _idigUploadProtocol
_idigAccessToken
_idigUploadType
_idigConnectorName
_idigDebugOptionsEnableDebugging
_idigCallback
(Just AltJSON)
cloudSearchService
where go
= buildClient
(Proxy :: Proxy IndexingDatasourcesItemsGetResource)
mempty