{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.FirebaseHosting.Types
(
firebaseHostingService
, firebaseScope
, cloudPlatformReadOnlyScope
, cloudPlatformScope
, firebaseReadOnlyScope
, DomainStatus (..)
, DomainProvisioningDNSStatus (..)
, VersionLabels
, versionLabels
, vlAddtional
, PopulateVersionFilesResponse
, populateVersionFilesResponse
, pvfrUploadURL
, pvfrUploadRequiredHashes
, DomainRedirectType (..)
, CertDNSChallenge
, certDNSChallenge
, cdcToken
, cdcDomainName
, Empty
, empty
, PopulateVersionFilesRequest
, populateVersionFilesRequest
, pvfrFiles
, ServingConfigAppAssociation (..)
, ServingConfig
, servingConfig
, scCleanURLs
, scAppAssociation
, scRewrites
, scRedirects
, scHeaders
, scTrailingSlashBehavior
, Domain
, domain
, dStatus
, dProvisioning
, dUpdateTime
, dDomainName
, dDomainRedirect
, dSite
, ListReleasesResponse
, listReleasesResponse
, lrrNextPageToken
, lrrReleases
, VersionStatus (..)
, DomainProvisioning
, domainProvisioning
, dpExpectedIPs
, dpCertChallengeDNS
, dpDNSFetchTime
, dpCertStatus
, dpDNSStatus
, dpDiscoveredIPs
, dpCertChallengeHTTP
, dpCertChallengeDiscoveredTxt
, Release
, release
, rReleaseTime
, rReleaseUser
, rName
, rVersion
, rType
, rMessage
, VersionFile
, versionFile
, vfStatus
, vfHash
, vfPath
, Header
, header
, hHeaders
, hGlob
, ActingUser
, actingUser
, auEmail
, auImageURL
, Version
, version
, vStatus
, vFinalizeTime
, vConfig
, vFileCount
, vFinalizeUser
, vVersionBytes
, vDeleteTime
, vName
, vLabels
, vCreateUser
, vDeleteUser
, vCreateTime
, ListDomainsResponse
, listDomainsResponse
, ldrNextPageToken
, ldrDomains
, Xgafv (..)
, Redirect
, redirect
, rLocation
, rGlob
, rStatusCode
, DomainRedirect
, domainRedirect
, drDomainName
, drType
, Rewrite
, rewrite
, rewFunction
, rewPath
, rewGlob
, rewDynamicLinks
, DomainProvisioningCertStatus (..)
, PopulateVersionFilesRequestFiles
, populateVersionFilesRequestFiles
, pvfrfAddtional
, VersionFileStatus (..)
, HeaderHeaders
, headerHeaders
, hhAddtional
, CertHTTPChallenge
, certHTTPChallenge
, chttpcPath
, chttpcToken
, ServingConfigTrailingSlashBehavior (..)
, ListVersionFilesResponse
, listVersionFilesResponse
, lvfrNextPageToken
, lvfrFiles
, ReleaseType (..)
, SiteConfig
, siteConfig
, scMaxVersions
) where
import Network.Google.FirebaseHosting.Types.Product
import Network.Google.FirebaseHosting.Types.Sum
import Network.Google.Prelude
firebaseHostingService :: ServiceConfig
firebaseHostingService
= defaultService
(ServiceId "firebasehosting:v1beta1")
"firebasehosting.googleapis.com"
firebaseScope :: Proxy '["https://www.googleapis.com/auth/firebase"]
firebaseScope = Proxy;
cloudPlatformReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform.read-only"]
cloudPlatformReadOnlyScope = Proxy;
cloudPlatformScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform"]
cloudPlatformScope = Proxy;
firebaseReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/firebase.readonly"]
firebaseReadOnlyScope = Proxy;