{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.SafeBrowsing.Types
(
safeBrowsingService
, ListUpdateRequestThreatType (..)
, ListUpdateResponsePlatformType (..)
, ThreatEntryMetadata
, threatEntryMetadata
, temEntries
, UserInfo
, userInfo
, uiRegionCode
, uiUserId
, ThreatMatchThreatEntryType (..)
, ThreatMatchPlatformType (..)
, Checksum
, checksum
, cSha256
, FindThreatMatchesResponse
, findThreatMatchesResponse
, ftmrMatches
, ThreatListDescriptorThreatEntryType (..)
, Empty
, empty
, ListUpdateRequestPlatformType (..)
, ThreatListDescriptorPlatformType (..)
, ThreatInfo
, threatInfo
, tiThreatEntries
, tiThreatTypes
, tiPlatformTypes
, tiThreatEntryTypes
, ListUpdateResponseResponseType (..)
, ThreatSourceType (..)
, ThreatHit
, threatHit
, thUserInfo
, thThreatType
, thResources
, thEntry
, thClientInfo
, thPlatformType
, FetchThreatListUpdatesRequest
, fetchThreatListUpdatesRequest
, ftlurListUpdateRequests
, ftlurClient
, FindFullHashesRequest
, findFullHashesRequest
, ffhrThreatInfo
, ffhrAPIClient
, ffhrClientStates
, ffhrClient
, ThreatMatchThreatType (..)
, ThreatEntrySetCompressionType (..)
, Constraints
, constraints
, cMaxUpdateEntries
, cDeviceLocation
, cLanguage
, cRegion
, cSupportedCompressions
, cMaxDatabaseEntries
, RiceDeltaEncoding
, riceDeltaEncoding
, rdeFirstValue
, rdeRiceParameter
, rdeNumEntries
, rdeEncodedData
, ListThreatListsResponse
, listThreatListsResponse
, ltlrThreatLists
, ThreatListDescriptorThreatType (..)
, ThreatHitPlatformType (..)
, ThreatListDescriptor
, threatListDescriptor
, tldThreatEntryType
, tldThreatType
, tldPlatformType
, ClientInfo
, clientInfo
, ciClientId
, ciClientVersion
, FindThreatMatchesRequest
, findThreatMatchesRequest
, ftmrThreatInfo
, ftmrClient
, Xgafv (..)
, ListUpdateRequest
, listUpdateRequest
, lurState
, lurThreatEntryType
, lurConstraints
, lurThreatType
, lurPlatformType
, ListUpdateResponseThreatEntryType (..)
, ThreatEntry
, threatEntry
, teHash
, teURL
, teDigest
, ThreatMatch
, threatMatch
, tmThreatEntryMetadata
, tmThreatEntryType
, tmThreatType
, tmPlatformType
, tmCacheDuration
, tmThreat
, ThreatHitThreatType (..)
, ListUpdateRequestThreatEntryType (..)
, RawHashes
, rawHashes
, rhPrefixSize
, rhRawHashes
, ListUpdateResponse
, listUpdateResponse
, lAdditions
, lThreatEntryType
, lChecksum
, lThreatType
, lPlatformType
, lNewClientState
, lRemovals
, lResponseType
, ThreatEntrySet
, threatEntrySet
, tesRiceHashes
, tesRiceIndices
, tesRawHashes
, tesRawIndices
, tesCompressionType
, RawIndices
, rawIndices
, riIndices
, ThreatSource
, threatSource
, tsRemoteIP
, tsURL
, tsReferrer
, tsType
, ListUpdateResponseThreatType (..)
, FindFullHashesResponse
, findFullHashesResponse
, ffhrMatches
, ffhrNegativeCacheDuration
, ffhrMinimumWaitDuration
, MetadataEntry
, metadataEntry
, meValue
, meKey
, FetchThreatListUpdatesResponse
, fetchThreatListUpdatesResponse
, ftlurListUpdateResponses
, ftlurMinimumWaitDuration
) where
import Network.Google.Prelude
import Network.Google.SafeBrowsing.Types.Product
import Network.Google.SafeBrowsing.Types.Sum
safeBrowsingService :: ServiceConfig
safeBrowsingService
= defaultService (ServiceId "safebrowsing:v4")
"safebrowsing.googleapis.com"