{-# 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.Vault.Matters.Get
(
MattersGetResource
, mattersGet
, MattersGet
, mgXgafv
, mgUploadProtocol
, mgAccessToken
, mgUploadType
, mgMatterId
, mgView
, mgCallback
) where
import Network.Google.Prelude
import Network.Google.Vault.Types
type MattersGetResource =
"v1" :>
"matters" :>
Capture "matterId" Text :>
QueryParam "$.xgafv" Xgafv :>
QueryParam "upload_protocol" Text :>
QueryParam "access_token" Text :>
QueryParam "uploadType" Text :>
QueryParam "view" Text :>
QueryParam "callback" Text :>
QueryParam "alt" AltJSON :> Get '[JSON] Matter
data MattersGet = MattersGet'
{ _mgXgafv :: !(Maybe Xgafv)
, _mgUploadProtocol :: !(Maybe Text)
, _mgAccessToken :: !(Maybe Text)
, _mgUploadType :: !(Maybe Text)
, _mgMatterId :: !Text
, _mgView :: !(Maybe Text)
, _mgCallback :: !(Maybe Text)
} deriving (Eq,Show,Data,Typeable,Generic)
mattersGet
:: Text
-> MattersGet
mattersGet pMgMatterId_ =
MattersGet'
{ _mgXgafv = Nothing
, _mgUploadProtocol = Nothing
, _mgAccessToken = Nothing
, _mgUploadType = Nothing
, _mgMatterId = pMgMatterId_
, _mgView = Nothing
, _mgCallback = Nothing
}
mgXgafv :: Lens' MattersGet (Maybe Xgafv)
mgXgafv = lens _mgXgafv (\ s a -> s{_mgXgafv = a})
mgUploadProtocol :: Lens' MattersGet (Maybe Text)
mgUploadProtocol
= lens _mgUploadProtocol
(\ s a -> s{_mgUploadProtocol = a})
mgAccessToken :: Lens' MattersGet (Maybe Text)
mgAccessToken
= lens _mgAccessToken
(\ s a -> s{_mgAccessToken = a})
mgUploadType :: Lens' MattersGet (Maybe Text)
mgUploadType
= lens _mgUploadType (\ s a -> s{_mgUploadType = a})
mgMatterId :: Lens' MattersGet Text
mgMatterId
= lens _mgMatterId (\ s a -> s{_mgMatterId = a})
mgView :: Lens' MattersGet (Maybe Text)
mgView = lens _mgView (\ s a -> s{_mgView = a})
mgCallback :: Lens' MattersGet (Maybe Text)
mgCallback
= lens _mgCallback (\ s a -> s{_mgCallback = a})
instance GoogleRequest MattersGet where
type Rs MattersGet = Matter
type Scopes MattersGet =
'["https://www.googleapis.com/auth/ediscovery",
"https://www.googleapis.com/auth/ediscovery.readonly"]
requestClient MattersGet'{..}
= go _mgMatterId _mgXgafv _mgUploadProtocol
_mgAccessToken
_mgUploadType
_mgView
_mgCallback
(Just AltJSON)
vaultService
where go
= buildClient (Proxy :: Proxy MattersGetResource)
mempty