{-# 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.Debug.Identitysources.UnmAppedids.List
(
DebugIdentitysourcesUnmAppedidsListResource
, debugIdentitysourcesUnmAppedidsList
, DebugIdentitysourcesUnmAppedidsList
, diualParent
, diualXgafv
, diualResolutionStatusCode
, diualUploadProtocol
, diualAccessToken
, diualUploadType
, diualDebugOptionsEnableDebugging
, diualPageToken
, diualPageSize
, diualCallback
) where
import Network.Google.CloudSearch.Types
import Network.Google.Prelude
type DebugIdentitysourcesUnmAppedidsListResource =
"v1" :>
"debug" :>
Capture "parent" Text :>
"unmappedids" :>
QueryParam "$.xgafv" Xgafv :>
QueryParam "resolutionStatusCode" Text :>
QueryParam "upload_protocol" Text :>
QueryParam "access_token" Text :>
QueryParam "uploadType" Text :>
QueryParam "debugOptions.enableDebugging" Bool :>
QueryParam "pageToken" Text :>
QueryParam "pageSize" (Textual Int32) :>
QueryParam "callback" Text :>
QueryParam "alt" AltJSON :>
Get '[JSON] ListUnmAppedIdentitiesResponse
data DebugIdentitysourcesUnmAppedidsList = DebugIdentitysourcesUnmAppedidsList'
{ _diualParent :: !Text
, _diualXgafv :: !(Maybe Xgafv)
, _diualResolutionStatusCode :: !(Maybe Text)
, _diualUploadProtocol :: !(Maybe Text)
, _diualAccessToken :: !(Maybe Text)
, _diualUploadType :: !(Maybe Text)
, _diualDebugOptionsEnableDebugging :: !(Maybe Bool)
, _diualPageToken :: !(Maybe Text)
, _diualPageSize :: !(Maybe (Textual Int32))
, _diualCallback :: !(Maybe Text)
} deriving (Eq,Show,Data,Typeable,Generic)
debugIdentitysourcesUnmAppedidsList
:: Text
-> DebugIdentitysourcesUnmAppedidsList
debugIdentitysourcesUnmAppedidsList pDiualParent_ =
DebugIdentitysourcesUnmAppedidsList'
{ _diualParent = pDiualParent_
, _diualXgafv = Nothing
, _diualResolutionStatusCode = Nothing
, _diualUploadProtocol = Nothing
, _diualAccessToken = Nothing
, _diualUploadType = Nothing
, _diualDebugOptionsEnableDebugging = Nothing
, _diualPageToken = Nothing
, _diualPageSize = Nothing
, _diualCallback = Nothing
}
diualParent :: Lens' DebugIdentitysourcesUnmAppedidsList Text
diualParent
= lens _diualParent (\ s a -> s{_diualParent = a})
diualXgafv :: Lens' DebugIdentitysourcesUnmAppedidsList (Maybe Xgafv)
diualXgafv
= lens _diualXgafv (\ s a -> s{_diualXgafv = a})
diualResolutionStatusCode :: Lens' DebugIdentitysourcesUnmAppedidsList (Maybe Text)
diualResolutionStatusCode
= lens _diualResolutionStatusCode
(\ s a -> s{_diualResolutionStatusCode = a})
diualUploadProtocol :: Lens' DebugIdentitysourcesUnmAppedidsList (Maybe Text)
diualUploadProtocol
= lens _diualUploadProtocol
(\ s a -> s{_diualUploadProtocol = a})
diualAccessToken :: Lens' DebugIdentitysourcesUnmAppedidsList (Maybe Text)
diualAccessToken
= lens _diualAccessToken
(\ s a -> s{_diualAccessToken = a})
diualUploadType :: Lens' DebugIdentitysourcesUnmAppedidsList (Maybe Text)
diualUploadType
= lens _diualUploadType
(\ s a -> s{_diualUploadType = a})
diualDebugOptionsEnableDebugging :: Lens' DebugIdentitysourcesUnmAppedidsList (Maybe Bool)
diualDebugOptionsEnableDebugging
= lens _diualDebugOptionsEnableDebugging
(\ s a -> s{_diualDebugOptionsEnableDebugging = a})
diualPageToken :: Lens' DebugIdentitysourcesUnmAppedidsList (Maybe Text)
diualPageToken
= lens _diualPageToken
(\ s a -> s{_diualPageToken = a})
diualPageSize :: Lens' DebugIdentitysourcesUnmAppedidsList (Maybe Int32)
diualPageSize
= lens _diualPageSize
(\ s a -> s{_diualPageSize = a})
. mapping _Coerce
diualCallback :: Lens' DebugIdentitysourcesUnmAppedidsList (Maybe Text)
diualCallback
= lens _diualCallback
(\ s a -> s{_diualCallback = a})
instance GoogleRequest
DebugIdentitysourcesUnmAppedidsList where
type Rs DebugIdentitysourcesUnmAppedidsList =
ListUnmAppedIdentitiesResponse
type Scopes DebugIdentitysourcesUnmAppedidsList =
'["https://www.googleapis.com/auth/cloud_search",
"https://www.googleapis.com/auth/cloud_search.debug"]
requestClient
DebugIdentitysourcesUnmAppedidsList'{..}
= go _diualParent _diualXgafv
_diualResolutionStatusCode
_diualUploadProtocol
_diualAccessToken
_diualUploadType
_diualDebugOptionsEnableDebugging
_diualPageToken
_diualPageSize
_diualCallback
(Just AltJSON)
cloudSearchService
where go
= buildClient
(Proxy ::
Proxy DebugIdentitysourcesUnmAppedidsListResource)
mempty