{-# 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.CloudDebugger.Controller.Debuggees.Breakpoints.List
(
ControllerDebuggeesBreakpointsListResource
, controllerDebuggeesBreakpointsList
, ControllerDebuggeesBreakpointsList
, cdblXgafv
, cdblUploadProtocol
, cdblAccessToken
, cdblUploadType
, cdblSuccessOnTimeout
, cdblWaitToken
, cdblDebuggeeId
, cdblCallback
) where
import Network.Google.Debugger.Types
import Network.Google.Prelude
type ControllerDebuggeesBreakpointsListResource =
"v2" :>
"controller" :>
"debuggees" :>
Capture "debuggeeId" Text :>
"breakpoints" :>
QueryParam "$.xgafv" Xgafv :>
QueryParam "upload_protocol" Text :>
QueryParam "access_token" Text :>
QueryParam "uploadType" Text :>
QueryParam "successOnTimeout" Bool :>
QueryParam "waitToken" Text :>
QueryParam "callback" Text :>
QueryParam "alt" AltJSON :>
Get '[JSON] ListActiveBreakpointsResponse
data ControllerDebuggeesBreakpointsList = ControllerDebuggeesBreakpointsList'
{ _cdblXgafv :: !(Maybe Xgafv)
, _cdblUploadProtocol :: !(Maybe Text)
, _cdblAccessToken :: !(Maybe Text)
, _cdblUploadType :: !(Maybe Text)
, _cdblSuccessOnTimeout :: !(Maybe Bool)
, _cdblWaitToken :: !(Maybe Text)
, _cdblDebuggeeId :: !Text
, _cdblCallback :: !(Maybe Text)
} deriving (Eq,Show,Data,Typeable,Generic)
controllerDebuggeesBreakpointsList
:: Text
-> ControllerDebuggeesBreakpointsList
controllerDebuggeesBreakpointsList pCdblDebuggeeId_ =
ControllerDebuggeesBreakpointsList'
{ _cdblXgafv = Nothing
, _cdblUploadProtocol = Nothing
, _cdblAccessToken = Nothing
, _cdblUploadType = Nothing
, _cdblSuccessOnTimeout = Nothing
, _cdblWaitToken = Nothing
, _cdblDebuggeeId = pCdblDebuggeeId_
, _cdblCallback = Nothing
}
cdblXgafv :: Lens' ControllerDebuggeesBreakpointsList (Maybe Xgafv)
cdblXgafv
= lens _cdblXgafv (\ s a -> s{_cdblXgafv = a})
cdblUploadProtocol :: Lens' ControllerDebuggeesBreakpointsList (Maybe Text)
cdblUploadProtocol
= lens _cdblUploadProtocol
(\ s a -> s{_cdblUploadProtocol = a})
cdblAccessToken :: Lens' ControllerDebuggeesBreakpointsList (Maybe Text)
cdblAccessToken
= lens _cdblAccessToken
(\ s a -> s{_cdblAccessToken = a})
cdblUploadType :: Lens' ControllerDebuggeesBreakpointsList (Maybe Text)
cdblUploadType
= lens _cdblUploadType
(\ s a -> s{_cdblUploadType = a})
cdblSuccessOnTimeout :: Lens' ControllerDebuggeesBreakpointsList (Maybe Bool)
cdblSuccessOnTimeout
= lens _cdblSuccessOnTimeout
(\ s a -> s{_cdblSuccessOnTimeout = a})
cdblWaitToken :: Lens' ControllerDebuggeesBreakpointsList (Maybe Text)
cdblWaitToken
= lens _cdblWaitToken
(\ s a -> s{_cdblWaitToken = a})
cdblDebuggeeId :: Lens' ControllerDebuggeesBreakpointsList Text
cdblDebuggeeId
= lens _cdblDebuggeeId
(\ s a -> s{_cdblDebuggeeId = a})
cdblCallback :: Lens' ControllerDebuggeesBreakpointsList (Maybe Text)
cdblCallback
= lens _cdblCallback (\ s a -> s{_cdblCallback = a})
instance GoogleRequest
ControllerDebuggeesBreakpointsList where
type Rs ControllerDebuggeesBreakpointsList =
ListActiveBreakpointsResponse
type Scopes ControllerDebuggeesBreakpointsList =
'["https://www.googleapis.com/auth/cloud-platform",
"https://www.googleapis.com/auth/cloud_debugger"]
requestClient ControllerDebuggeesBreakpointsList'{..}
= go _cdblDebuggeeId _cdblXgafv _cdblUploadProtocol
_cdblAccessToken
_cdblUploadType
_cdblSuccessOnTimeout
_cdblWaitToken
_cdblCallback
(Just AltJSON)
debuggerService
where go
= buildClient
(Proxy ::
Proxy ControllerDebuggeesBreakpointsListResource)
mempty