{-# LANGUAGE DataKinds #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE TypeOperators #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-duplicate-exports #-}
module Network.Google.WebSecurityScanner
(
webSecurityScannerService
, cloudPlatformScope
, WebSecurityScannerAPI
, module Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.Create
, module Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.Delete
, module Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.Get
, module Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.List
, module Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.Patch
, module Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.ScanRuns.CrawledURLs.List
, module Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.ScanRuns.FindingTypeStats.List
, module Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.ScanRuns.Findings.Get
, module Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.ScanRuns.Findings.List
, module Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.ScanRuns.Get
, module Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.ScanRuns.List
, module Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.ScanRuns.Stop
, module Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.Start
, FindingTypeStats
, findingTypeStats
, ftsFindingCount
, ftsFindingType
, ListFindingsResponse
, listFindingsResponse
, lfrNextPageToken
, lfrFindings
, StopScanRunRequest
, stopScanRunRequest
, Schedule
, schedule
, sScheduleTime
, sIntervalDurationDays
, Finding
, finding
, fFinalURL
, fHTTPMethod
, fReProductionURL
, fTrackingId
, fBody
, fXss
, fVulnerableParameters
, fOutdatedLibrary
, fFuzzedURL
, fName
, fFindingType
, fVulnerableHeaders
, fViolatingResource
, fFrameURL
, fDescription
, Empty
, empty
, ListFindingTypeStatsResponse
, listFindingTypeStatsResponse
, lftsrFindingTypeStats
, GoogleAccount
, googleAccount
, gaUsername
, gaPassword
, Xss
, xss
, xStackTraces
, xErrorMessage
, Authentication
, authentication
, aGoogleAccount
, aCustomAccount
, FindingFindingType (..)
, ListCrawledURLsResponse
, listCrawledURLsResponse
, lcurNextPageToken
, lcurCrawledURLs
, VulnerableParameters
, vulnerableParameters
, vpParameterNames
, CrawledURL
, crawledURL
, cuHTTPMethod
, cuBody
, cuURL
, OutdatedLibrary
, outdatedLibrary
, olLearnMoreURLs
, olVersion
, olLibraryName
, ListScanRunsResponse
, listScanRunsResponse
, lsrrNextPageToken
, lsrrScanRuns
, Header
, header
, hValue
, hName
, ListScanConfigsResponse
, listScanConfigsResponse
, lscrNextPageToken
, lscrScanConfigs
, StartScanRunRequest
, startScanRunRequest
, Xgafv (..)
, CustomAccount
, customAccount
, caLoginURL
, caUsername
, caPassword
, ScanConfigUserAgent (..)
, ScanConfig
, scanConfig
, scSchedule
, scTargetPlatforms
, scStartingURLs
, scAuthentication
, scMaxQps
, scName
, scDisplayName
, scUserAgent
, scBlackListPatterns
, ScanRunResultState (..)
, VulnerableHeaders
, vulnerableHeaders
, vhMissingHeaders
, vhHeaders
, ViolatingResource
, violatingResource
, vrContentType
, vrResourceURL
, ScanRunExecutionState (..)
, ScanRun
, scanRun
, srStartTime
, srHasVulnerabilities
, srResultState
, srProgressPercent
, srURLsCrawledCount
, srURLsTestedCount
, srName
, srEndTime
, srExecutionState
, FindingTypeStatsFindingType (..)
) where
import Network.Google.Prelude
import Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.Create
import Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.Delete
import Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.Get
import Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.List
import Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.Patch
import Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.ScanRuns.CrawledURLs.List
import Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.ScanRuns.Findings.Get
import Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.ScanRuns.Findings.List
import Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.ScanRuns.FindingTypeStats.List
import Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.ScanRuns.Get
import Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.ScanRuns.List
import Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.ScanRuns.Stop
import Network.Google.Resource.WebSecurityScanner.Projects.ScanConfigs.Start
import Network.Google.WebSecurityScanner.Types
type WebSecurityScannerAPI =
ProjectsScanConfigsScanRunsFindingTypeStatsListResource
:<|>
ProjectsScanConfigsScanRunsCrawledURLsListResource
:<|> ProjectsScanConfigsScanRunsFindingsListResource
:<|> ProjectsScanConfigsScanRunsFindingsGetResource
:<|> ProjectsScanConfigsScanRunsListResource
:<|> ProjectsScanConfigsScanRunsGetResource
:<|> ProjectsScanConfigsScanRunsStopResource
:<|> ProjectsScanConfigsListResource
:<|> ProjectsScanConfigsStartResource
:<|> ProjectsScanConfigsPatchResource
:<|> ProjectsScanConfigsGetResource
:<|> ProjectsScanConfigsCreateResource
:<|> ProjectsScanConfigsDeleteResource