{-# 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.Directory.VerificationCodes.Invalidate
(
VerificationCodesInvalidateResource
, verificationCodesInvalidate
, VerificationCodesInvalidate
, vciUserKey
) where
import Network.Google.Directory.Types
import Network.Google.Prelude
type VerificationCodesInvalidateResource =
"admin" :>
"directory" :>
"v1" :>
"users" :>
Capture "userKey" Text :>
"verificationCodes" :>
"invalidate" :>
QueryParam "alt" AltJSON :> Post '[JSON] ()
newtype VerificationCodesInvalidate = VerificationCodesInvalidate'
{ _vciUserKey :: Text
} deriving (Eq,Show,Data,Typeable,Generic)
verificationCodesInvalidate
:: Text
-> VerificationCodesInvalidate
verificationCodesInvalidate pVciUserKey_ =
VerificationCodesInvalidate'
{ _vciUserKey = pVciUserKey_
}
vciUserKey :: Lens' VerificationCodesInvalidate Text
vciUserKey
= lens _vciUserKey (\ s a -> s{_vciUserKey = a})
instance GoogleRequest VerificationCodesInvalidate
where
type Rs VerificationCodesInvalidate = ()
type Scopes VerificationCodesInvalidate =
'["https://www.googleapis.com/auth/admin.directory.user.security"]
requestClient VerificationCodesInvalidate'{..}
= go _vciUserKey (Just AltJSON) directoryService
where go
= buildClient
(Proxy :: Proxy VerificationCodesInvalidateResource)
mempty