{-# LANGUAGE DataKinds #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE TypeOperators #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-duplicate-exports #-}
module Network.Google.IAP
(
iAPService
, cloudPlatformScope
, IAPAPI
, module Network.Google.Resource.IAP.GetIAMPolicy
, module Network.Google.Resource.IAP.SetIAMPolicy
, module Network.Google.Resource.IAP.TestIAMPermissions
, Expr
, expr
, eLocation
, eExpression
, eTitle
, eDescription
, GetIAMPolicyRequest
, getIAMPolicyRequest
, SetIAMPolicyRequest
, setIAMPolicyRequest
, siprPolicy
, Xgafv (..)
, TestIAMPermissionsRequest
, testIAMPermissionsRequest
, tiprPermissions
, TestIAMPermissionsResponse
, testIAMPermissionsResponse
, tiamprPermissions
, Policy
, policy
, pEtag
, pVersion
, pBindings
, Binding
, binding
, bMembers
, bRole
, bCondition
) where
import Network.Google.IAP.Types
import Network.Google.Prelude
import Network.Google.Resource.IAP.GetIAMPolicy
import Network.Google.Resource.IAP.SetIAMPolicy
import Network.Google.Resource.IAP.TestIAMPermissions
type IAPAPI =
GetIAMPolicyResource :<|> SetIAMPolicyResource :<|>
TestIAMPermissionsResource