gogol-websecurityscanner-0.5.0: Google Web Security Scanner SDK.

Copyright(c) 2015-2016 Brendan Hay
LicenseMozilla Public License, v. 2.0.
MaintainerBrendan Hay <brendan.g.hay@gmail.com>
Stabilityauto-generated
Portabilitynon-portable (GHC extensions)
Safe HaskellNone
LanguageHaskell2010

Network.Google.WebSecurityScanner.Types

Contents

Description

 
Synopsis

Service Configuration

webSecurityScannerService :: ServiceConfig Source #

Default request referring to version v1beta of the Web Security Scanner API. This contains the host and root path used as a starting point for constructing service requests.

OAuth Scopes

cloudPlatformScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform"] Source #

View and manage your data across Google Cloud Platform services

FindingTypeStats

data FindingTypeStats Source #

A FindingTypeStats resource represents stats regarding a specific FindingType of Findings under a given ScanRun.

See: findingTypeStats smart constructor.

Instances
Eq FindingTypeStats Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data FindingTypeStats Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FindingTypeStats -> c FindingTypeStats #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FindingTypeStats #

toConstr :: FindingTypeStats -> Constr #

dataTypeOf :: FindingTypeStats -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FindingTypeStats) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FindingTypeStats) #

gmapT :: (forall b. Data b => b -> b) -> FindingTypeStats -> FindingTypeStats #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FindingTypeStats -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FindingTypeStats -> r #

gmapQ :: (forall d. Data d => d -> u) -> FindingTypeStats -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FindingTypeStats -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FindingTypeStats -> m FindingTypeStats #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FindingTypeStats -> m FindingTypeStats #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FindingTypeStats -> m FindingTypeStats #

Show FindingTypeStats Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic FindingTypeStats Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep FindingTypeStats :: Type -> Type #

ToJSON FindingTypeStats Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON FindingTypeStats Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep FindingTypeStats Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep FindingTypeStats = D1 (MetaData "FindingTypeStats" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "FindingTypeStats'" PrefixI True) (S1 (MetaSel (Just "_ftsFindingCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_ftsFindingType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

findingTypeStats :: FindingTypeStats Source #

Creates a value of FindingTypeStats with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ftsFindingCount :: Lens' FindingTypeStats (Maybe Int32) Source #

Output only. The count of findings belonging to this finding type.

ftsFindingType :: Lens' FindingTypeStats (Maybe Text) Source #

Output only. The finding type associated with the stats.

ListFindingsResponse

data ListFindingsResponse Source #

Response for the `ListFindings` method.

See: listFindingsResponse smart constructor.

Instances
Eq ListFindingsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data ListFindingsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ListFindingsResponse -> c ListFindingsResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ListFindingsResponse #

toConstr :: ListFindingsResponse -> Constr #

dataTypeOf :: ListFindingsResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ListFindingsResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ListFindingsResponse) #

gmapT :: (forall b. Data b => b -> b) -> ListFindingsResponse -> ListFindingsResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ListFindingsResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ListFindingsResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ListFindingsResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ListFindingsResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ListFindingsResponse -> m ListFindingsResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ListFindingsResponse -> m ListFindingsResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ListFindingsResponse -> m ListFindingsResponse #

Show ListFindingsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic ListFindingsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep ListFindingsResponse :: Type -> Type #

ToJSON ListFindingsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON ListFindingsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ListFindingsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ListFindingsResponse = D1 (MetaData "ListFindingsResponse" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "ListFindingsResponse'" PrefixI True) (S1 (MetaSel (Just "_lfrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lfrFindings") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Finding]))))

listFindingsResponse :: ListFindingsResponse Source #

Creates a value of ListFindingsResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lfrNextPageToken :: Lens' ListFindingsResponse (Maybe Text) Source #

Token to retrieve the next page of results, or empty if there are no more results in the list.

lfrFindings :: Lens' ListFindingsResponse [Finding] Source #

The list of Findings returned.

StopScanRunRequest

data StopScanRunRequest Source #

Request for the `StopScanRun` method.

See: stopScanRunRequest smart constructor.

Instances
Eq StopScanRunRequest Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data StopScanRunRequest Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> StopScanRunRequest -> c StopScanRunRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c StopScanRunRequest #

toConstr :: StopScanRunRequest -> Constr #

dataTypeOf :: StopScanRunRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c StopScanRunRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c StopScanRunRequest) #

gmapT :: (forall b. Data b => b -> b) -> StopScanRunRequest -> StopScanRunRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> StopScanRunRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> StopScanRunRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> StopScanRunRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> StopScanRunRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> StopScanRunRequest -> m StopScanRunRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> StopScanRunRequest -> m StopScanRunRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> StopScanRunRequest -> m StopScanRunRequest #

Show StopScanRunRequest Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic StopScanRunRequest Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep StopScanRunRequest :: Type -> Type #

ToJSON StopScanRunRequest Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON StopScanRunRequest Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep StopScanRunRequest Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep StopScanRunRequest = D1 (MetaData "StopScanRunRequest" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "StopScanRunRequest'" PrefixI False) (U1 :: Type -> Type))

stopScanRunRequest :: StopScanRunRequest Source #

Creates a value of StopScanRunRequest with the minimum fields required to make a request.

ScanRunErrorTraceCode

data ScanRunErrorTraceCode Source #

Output only. Indicates the error reason code.

Constructors

CodeUnspecified

CODE_UNSPECIFIED Default value is never used.

InternalError

INTERNAL_ERROR Indicates that the scan run failed due to an internal server error.

ScanConfigIssue

SCAN_CONFIG_ISSUE Indicates a scan configuration error, usually due to outdated ScanConfig settings, such as starting_urls or the DNS configuration.

AuthenticationConfigIssue

AUTHENTICATION_CONFIG_ISSUE Indicates an authentication error, usually due to outdated ScanConfig authentication settings.

TimedOutWhileScanning

TIMED_OUT_WHILE_SCANNING Indicates a scan operation timeout, usually caused by a very large site.

TooManyRedirects

TOO_MANY_REDIRECTS Indicates that a scan encountered excessive redirects, either to authentication or some other page outside of the scan scope.

TooManyHTTPErrors

TOO_MANY_HTTP_ERRORS Indicates that a scan encountered numerous errors from the web site pages. When available, most_common_http_error_code field indicates the the most common HTTP error code encountered during the scan.

Instances
Enum ScanRunErrorTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Eq ScanRunErrorTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Data ScanRunErrorTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ScanRunErrorTraceCode -> c ScanRunErrorTraceCode #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ScanRunErrorTraceCode #

toConstr :: ScanRunErrorTraceCode -> Constr #

dataTypeOf :: ScanRunErrorTraceCode -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ScanRunErrorTraceCode) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ScanRunErrorTraceCode) #

gmapT :: (forall b. Data b => b -> b) -> ScanRunErrorTraceCode -> ScanRunErrorTraceCode #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ScanRunErrorTraceCode -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ScanRunErrorTraceCode -> r #

gmapQ :: (forall d. Data d => d -> u) -> ScanRunErrorTraceCode -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ScanRunErrorTraceCode -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ScanRunErrorTraceCode -> m ScanRunErrorTraceCode #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanRunErrorTraceCode -> m ScanRunErrorTraceCode #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanRunErrorTraceCode -> m ScanRunErrorTraceCode #

Ord ScanRunErrorTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Read ScanRunErrorTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Show ScanRunErrorTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Generic ScanRunErrorTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Associated Types

type Rep ScanRunErrorTraceCode :: Type -> Type #

Hashable ScanRunErrorTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

ToJSON ScanRunErrorTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

FromJSON ScanRunErrorTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

FromHttpApiData ScanRunErrorTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

ToHttpApiData ScanRunErrorTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

type Rep ScanRunErrorTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

type Rep ScanRunErrorTraceCode = D1 (MetaData "ScanRunErrorTraceCode" "Network.Google.WebSecurityScanner.Types.Sum" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) ((C1 (MetaCons "CodeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "InternalError" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ScanConfigIssue" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "AuthenticationConfigIssue" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TimedOutWhileScanning" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "TooManyRedirects" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TooManyHTTPErrors" PrefixI False) (U1 :: Type -> Type))))

ScanConfigError

data ScanConfigError Source #

Defines a custom error message used by CreateScanConfig and UpdateScanConfig APIs when scan configuration validation fails. It is also reported as part of a ScanRunErrorTrace message if scan validation fails due to a scan configuration error.

See: scanConfigError smart constructor.

Instances
Eq ScanConfigError Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data ScanConfigError Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ScanConfigError -> c ScanConfigError #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ScanConfigError #

toConstr :: ScanConfigError -> Constr #

dataTypeOf :: ScanConfigError -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ScanConfigError) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ScanConfigError) #

gmapT :: (forall b. Data b => b -> b) -> ScanConfigError -> ScanConfigError #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ScanConfigError -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ScanConfigError -> r #

gmapQ :: (forall d. Data d => d -> u) -> ScanConfigError -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ScanConfigError -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ScanConfigError -> m ScanConfigError #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanConfigError -> m ScanConfigError #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanConfigError -> m ScanConfigError #

Show ScanConfigError Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic ScanConfigError Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep ScanConfigError :: Type -> Type #

ToJSON ScanConfigError Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON ScanConfigError Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ScanConfigError Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ScanConfigError = D1 (MetaData "ScanConfigError" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "ScanConfigError'" PrefixI True) (S1 (MetaSel (Just "_sceFieldName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_sceCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ScanConfigErrorCode))))

scanConfigError :: ScanConfigError Source #

Creates a value of ScanConfigError with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

sceFieldName :: Lens' ScanConfigError (Maybe Text) Source #

Output only. Indicates the full name of the ScanConfig field that triggers this error, for example "scan_config.max_qps". This field is provided for troubleshooting purposes only and its actual value can change in the future.

sceCode :: Lens' ScanConfigError (Maybe ScanConfigErrorCode) Source #

Output only. Indicates the reason code for a configuration failure.

Schedule

data Schedule Source #

Scan schedule configuration.

See: schedule smart constructor.

Instances
Eq Schedule Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data Schedule Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Schedule -> c Schedule #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Schedule #

toConstr :: Schedule -> Constr #

dataTypeOf :: Schedule -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Schedule) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Schedule) #

gmapT :: (forall b. Data b => b -> b) -> Schedule -> Schedule #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Schedule -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Schedule -> r #

gmapQ :: (forall d. Data d => d -> u) -> Schedule -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Schedule -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Schedule -> m Schedule #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Schedule -> m Schedule #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Schedule -> m Schedule #

Show Schedule Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic Schedule Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep Schedule :: Type -> Type #

Methods

from :: Schedule -> Rep Schedule x #

to :: Rep Schedule x -> Schedule #

ToJSON Schedule Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON Schedule Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep Schedule Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep Schedule = D1 (MetaData "Schedule" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "Schedule'" PrefixI True) (S1 (MetaSel (Just "_sScheduleTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_sIntervalDurationDays") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))

schedule :: Schedule Source #

Creates a value of Schedule with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

sScheduleTime :: Lens' Schedule (Maybe UTCTime) Source #

A timestamp indicates when the next run will be scheduled. The value is refreshed by the server after each run. If unspecified, it will default to current server time, which means the scan will be scheduled to start immediately.

sIntervalDurationDays :: Lens' Schedule (Maybe Int32) Source #

Required. The duration of time between executions in days.

Finding

data Finding Source #

A Finding resource represents a vulnerability instance identified during a ScanRun.

See: finding smart constructor.

Instances
Eq Finding Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

(==) :: Finding -> Finding -> Bool #

(/=) :: Finding -> Finding -> Bool #

Data Finding Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Finding -> c Finding #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Finding #

toConstr :: Finding -> Constr #

dataTypeOf :: Finding -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Finding) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Finding) #

gmapT :: (forall b. Data b => b -> b) -> Finding -> Finding #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Finding -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Finding -> r #

gmapQ :: (forall d. Data d => d -> u) -> Finding -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Finding -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Finding -> m Finding #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Finding -> m Finding #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Finding -> m Finding #

Show Finding Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic Finding Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep Finding :: Type -> Type #

Methods

from :: Finding -> Rep Finding x #

to :: Rep Finding x -> Finding #

ToJSON Finding Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON Finding Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep Finding Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep Finding = D1 (MetaData "Finding" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "Finding'" PrefixI True) ((((S1 (MetaSel (Just "_fFinalURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_fHTTPMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_fReProductionURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_fTrackingId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_fBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_fXss") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Xss))) :*: (S1 (MetaSel (Just "_fVulnerableParameters") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe VulnerableParameters)) :*: S1 (MetaSel (Just "_fOutdatedLibrary") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OutdatedLibrary))))) :*: (((S1 (MetaSel (Just "_fFuzzedURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_fName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_fFindingType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_fVulnerableHeaders") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe VulnerableHeaders)))) :*: ((S1 (MetaSel (Just "_fViolatingResource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ViolatingResource)) :*: S1 (MetaSel (Just "_fForm") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Form))) :*: (S1 (MetaSel (Just "_fFrameURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_fDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

finding :: Finding Source #

Creates a value of Finding with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

fFinalURL :: Lens' Finding (Maybe Text) Source #

Output only. The URL where the browser lands when the vulnerability is detected.

fHTTPMethod :: Lens' Finding (Maybe Text) Source #

Output only. The http method of the request that triggered the vulnerability, in uppercase.

fReProductionURL :: Lens' Finding (Maybe Text) Source #

Output only. The URL containing human-readable payload that user can leverage to reproduce the vulnerability.

fTrackingId :: Lens' Finding (Maybe Text) Source #

Output only. The tracking ID uniquely identifies a vulnerability instance across multiple ScanRuns.

fBody :: Lens' Finding (Maybe Text) Source #

Output only. The body of the request that triggered the vulnerability.

fXss :: Lens' Finding (Maybe Xss) Source #

Output only. An addon containing information reported for an XSS, if any.

fVulnerableParameters :: Lens' Finding (Maybe VulnerableParameters) Source #

Output only. An addon containing information about request parameters which were found to be vulnerable.

fOutdatedLibrary :: Lens' Finding (Maybe OutdatedLibrary) Source #

Output only. An addon containing information about outdated libraries.

fFuzzedURL :: Lens' Finding (Maybe Text) Source #

Output only. The URL produced by the server-side fuzzer and used in the request that triggered the vulnerability.

fName :: Lens' Finding (Maybe Text) Source #

Output only. The resource name of the Finding. The name follows the format of 'projects/{projectId}/scanConfigs/{scanConfigId}/scanruns/{scanRunId}/findings/{findingId}'. The finding IDs are generated by the system.

fFindingType :: Lens' Finding (Maybe Text) Source #

Output only. The type of the Finding. Detailed and up-to-date information on findings can be found here: https://cloud.google.com/security-scanner/docs/scan-result-details

fVulnerableHeaders :: Lens' Finding (Maybe VulnerableHeaders) Source #

Output only. An addon containing information about vulnerable or missing HTTP headers.

fViolatingResource :: Lens' Finding (Maybe ViolatingResource) Source #

Output only. An addon containing detailed information regarding any resource causing the vulnerability such as JavaScript sources, image, audio files, etc.

fForm :: Lens' Finding (Maybe Form) Source #

Output only. An addon containing information reported for a vulnerability with an HTML form, if any.

fFrameURL :: Lens' Finding (Maybe Text) Source #

Output only. If the vulnerability was originated from nested IFrame, the immediate parent IFrame is reported.

fDescription :: Lens' Finding (Maybe Text) Source #

Output only. The description of the vulnerability.

Empty

data Empty Source #

A generic empty message that you can re-use to avoid defining duplicated empty messages in your APIs. A typical example is to use it as the request or the response type of an API method. For instance: service Foo { rpc Bar(google.protobuf.Empty) returns (google.protobuf.Empty); } The JSON representation for `Empty` is empty JSON object `{}`.

See: empty smart constructor.

Instances
Eq Empty Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

(==) :: Empty -> Empty -> Bool #

(/=) :: Empty -> Empty -> Bool #

Data Empty Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Empty -> c Empty #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Empty #

toConstr :: Empty -> Constr #

dataTypeOf :: Empty -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Empty) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Empty) #

gmapT :: (forall b. Data b => b -> b) -> Empty -> Empty #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Empty -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Empty -> r #

gmapQ :: (forall d. Data d => d -> u) -> Empty -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Empty -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Empty -> m Empty #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Empty -> m Empty #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Empty -> m Empty #

Show Empty Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

showsPrec :: Int -> Empty -> ShowS #

show :: Empty -> String #

showList :: [Empty] -> ShowS #

Generic Empty Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep Empty :: Type -> Type #

Methods

from :: Empty -> Rep Empty x #

to :: Rep Empty x -> Empty #

ToJSON Empty Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON Empty Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep Empty Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep Empty = D1 (MetaData "Empty" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "Empty'" PrefixI False) (U1 :: Type -> Type))

empty :: Empty Source #

Creates a value of Empty with the minimum fields required to make a request.

ScanRunWarningTrace

data ScanRunWarningTrace Source #

Output only. Defines a warning trace message for ScanRun. Warning traces provide customers with useful information that helps make the scanning process more effective.

See: scanRunWarningTrace smart constructor.

Instances
Eq ScanRunWarningTrace Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data ScanRunWarningTrace Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ScanRunWarningTrace -> c ScanRunWarningTrace #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ScanRunWarningTrace #

toConstr :: ScanRunWarningTrace -> Constr #

dataTypeOf :: ScanRunWarningTrace -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ScanRunWarningTrace) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ScanRunWarningTrace) #

gmapT :: (forall b. Data b => b -> b) -> ScanRunWarningTrace -> ScanRunWarningTrace #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ScanRunWarningTrace -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ScanRunWarningTrace -> r #

gmapQ :: (forall d. Data d => d -> u) -> ScanRunWarningTrace -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ScanRunWarningTrace -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ScanRunWarningTrace -> m ScanRunWarningTrace #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanRunWarningTrace -> m ScanRunWarningTrace #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanRunWarningTrace -> m ScanRunWarningTrace #

Show ScanRunWarningTrace Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic ScanRunWarningTrace Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep ScanRunWarningTrace :: Type -> Type #

ToJSON ScanRunWarningTrace Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON ScanRunWarningTrace Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ScanRunWarningTrace Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ScanRunWarningTrace = D1 (MetaData "ScanRunWarningTrace" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" True) (C1 (MetaCons "ScanRunWarningTrace'" PrefixI True) (S1 (MetaSel (Just "_srwtCode") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe ScanRunWarningTraceCode))))

scanRunWarningTrace :: ScanRunWarningTrace Source #

Creates a value of ScanRunWarningTrace with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

srwtCode :: Lens' ScanRunWarningTrace (Maybe ScanRunWarningTraceCode) Source #

Output only. Indicates the warning code.

ListFindingTypeStatsResponse

data ListFindingTypeStatsResponse Source #

Response for the `ListFindingTypeStats` method.

See: listFindingTypeStatsResponse smart constructor.

Instances
Eq ListFindingTypeStatsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data ListFindingTypeStatsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ListFindingTypeStatsResponse -> c ListFindingTypeStatsResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ListFindingTypeStatsResponse #

toConstr :: ListFindingTypeStatsResponse -> Constr #

dataTypeOf :: ListFindingTypeStatsResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ListFindingTypeStatsResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ListFindingTypeStatsResponse) #

gmapT :: (forall b. Data b => b -> b) -> ListFindingTypeStatsResponse -> ListFindingTypeStatsResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ListFindingTypeStatsResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ListFindingTypeStatsResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ListFindingTypeStatsResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ListFindingTypeStatsResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ListFindingTypeStatsResponse -> m ListFindingTypeStatsResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ListFindingTypeStatsResponse -> m ListFindingTypeStatsResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ListFindingTypeStatsResponse -> m ListFindingTypeStatsResponse #

Show ListFindingTypeStatsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic ListFindingTypeStatsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep ListFindingTypeStatsResponse :: Type -> Type #

ToJSON ListFindingTypeStatsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON ListFindingTypeStatsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ListFindingTypeStatsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ListFindingTypeStatsResponse = D1 (MetaData "ListFindingTypeStatsResponse" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" True) (C1 (MetaCons "ListFindingTypeStatsResponse'" PrefixI True) (S1 (MetaSel (Just "_lftsrFindingTypeStats") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [FindingTypeStats]))))

listFindingTypeStatsResponse :: ListFindingTypeStatsResponse Source #

Creates a value of ListFindingTypeStatsResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

GoogleAccount

data GoogleAccount Source #

Describes authentication configuration that uses a Google account.

See: googleAccount smart constructor.

Instances
Eq GoogleAccount Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data GoogleAccount Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GoogleAccount -> c GoogleAccount #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GoogleAccount #

toConstr :: GoogleAccount -> Constr #

dataTypeOf :: GoogleAccount -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GoogleAccount) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GoogleAccount) #

gmapT :: (forall b. Data b => b -> b) -> GoogleAccount -> GoogleAccount #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GoogleAccount -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GoogleAccount -> r #

gmapQ :: (forall d. Data d => d -> u) -> GoogleAccount -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GoogleAccount -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GoogleAccount -> m GoogleAccount #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleAccount -> m GoogleAccount #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GoogleAccount -> m GoogleAccount #

Show GoogleAccount Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic GoogleAccount Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep GoogleAccount :: Type -> Type #

ToJSON GoogleAccount Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON GoogleAccount Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep GoogleAccount Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep GoogleAccount = D1 (MetaData "GoogleAccount" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "GoogleAccount'" PrefixI True) (S1 (MetaSel (Just "_gaUsername") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gaPassword") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

googleAccount :: GoogleAccount Source #

Creates a value of GoogleAccount with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

gaUsername :: Lens' GoogleAccount (Maybe Text) Source #

Required. The user name of the Google account.

gaPassword :: Lens' GoogleAccount (Maybe Text) Source #

Input only. Required. The password of the Google account. The credential is stored encrypted and not returned in any response nor included in audit logs.

Xss

data Xss Source #

Information reported for an XSS.

See: xss smart constructor.

Instances
Eq Xss Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

(==) :: Xss -> Xss -> Bool #

(/=) :: Xss -> Xss -> Bool #

Data Xss Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Xss -> c Xss #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Xss #

toConstr :: Xss -> Constr #

dataTypeOf :: Xss -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Xss) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Xss) #

gmapT :: (forall b. Data b => b -> b) -> Xss -> Xss #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Xss -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Xss -> r #

gmapQ :: (forall d. Data d => d -> u) -> Xss -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Xss -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Xss -> m Xss #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Xss -> m Xss #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Xss -> m Xss #

Show Xss Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

showsPrec :: Int -> Xss -> ShowS #

show :: Xss -> String #

showList :: [Xss] -> ShowS #

Generic Xss Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep Xss :: Type -> Type #

Methods

from :: Xss -> Rep Xss x #

to :: Rep Xss x -> Xss #

ToJSON Xss Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON Xss Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep Xss Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep Xss = D1 (MetaData "Xss" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "Xss'" PrefixI True) (S1 (MetaSel (Just "_xStackTraces") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_xErrorMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

xss :: Xss Source #

Creates a value of Xss with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

xStackTraces :: Lens' Xss [Text] Source #

Stack traces leading to the point where the XSS occurred.

xErrorMessage :: Lens' Xss (Maybe Text) Source #

An error message generated by a javascript breakage.

Authentication

data Authentication Source #

Scan authentication configuration.

See: authentication smart constructor.

Instances
Eq Authentication Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data Authentication Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Authentication -> c Authentication #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Authentication #

toConstr :: Authentication -> Constr #

dataTypeOf :: Authentication -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Authentication) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Authentication) #

gmapT :: (forall b. Data b => b -> b) -> Authentication -> Authentication #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Authentication -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Authentication -> r #

gmapQ :: (forall d. Data d => d -> u) -> Authentication -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Authentication -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Authentication -> m Authentication #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Authentication -> m Authentication #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Authentication -> m Authentication #

Show Authentication Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic Authentication Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep Authentication :: Type -> Type #

ToJSON Authentication Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON Authentication Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep Authentication Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep Authentication = D1 (MetaData "Authentication" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "Authentication'" PrefixI True) (S1 (MetaSel (Just "_aGoogleAccount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GoogleAccount)) :*: S1 (MetaSel (Just "_aCustomAccount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CustomAccount))))

authentication :: Authentication Source #

Creates a value of Authentication with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

aGoogleAccount :: Lens' Authentication (Maybe GoogleAccount) Source #

Authentication using a Google account.

aCustomAccount :: Lens' Authentication (Maybe CustomAccount) Source #

Authentication using a custom account.

ListCrawledURLsResponse

data ListCrawledURLsResponse Source #

Response for the `ListCrawledUrls` method.

See: listCrawledURLsResponse smart constructor.

Instances
Eq ListCrawledURLsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data ListCrawledURLsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ListCrawledURLsResponse -> c ListCrawledURLsResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ListCrawledURLsResponse #

toConstr :: ListCrawledURLsResponse -> Constr #

dataTypeOf :: ListCrawledURLsResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ListCrawledURLsResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ListCrawledURLsResponse) #

gmapT :: (forall b. Data b => b -> b) -> ListCrawledURLsResponse -> ListCrawledURLsResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ListCrawledURLsResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ListCrawledURLsResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ListCrawledURLsResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ListCrawledURLsResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ListCrawledURLsResponse -> m ListCrawledURLsResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ListCrawledURLsResponse -> m ListCrawledURLsResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ListCrawledURLsResponse -> m ListCrawledURLsResponse #

Show ListCrawledURLsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic ListCrawledURLsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep ListCrawledURLsResponse :: Type -> Type #

ToJSON ListCrawledURLsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON ListCrawledURLsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ListCrawledURLsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ListCrawledURLsResponse = D1 (MetaData "ListCrawledURLsResponse" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "ListCrawledURLsResponse'" PrefixI True) (S1 (MetaSel (Just "_lcurNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lcurCrawledURLs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [CrawledURL]))))

listCrawledURLsResponse :: ListCrawledURLsResponse Source #

Creates a value of ListCrawledURLsResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lcurNextPageToken :: Lens' ListCrawledURLsResponse (Maybe Text) Source #

Token to retrieve the next page of results, or empty if there are no more results in the list.

lcurCrawledURLs :: Lens' ListCrawledURLsResponse [CrawledURL] Source #

The list of CrawledUrls returned.

VulnerableParameters

data VulnerableParameters Source #

Information about vulnerable request parameters.

See: vulnerableParameters smart constructor.

Instances
Eq VulnerableParameters Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data VulnerableParameters Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VulnerableParameters -> c VulnerableParameters #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c VulnerableParameters #

toConstr :: VulnerableParameters -> Constr #

dataTypeOf :: VulnerableParameters -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c VulnerableParameters) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c VulnerableParameters) #

gmapT :: (forall b. Data b => b -> b) -> VulnerableParameters -> VulnerableParameters #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VulnerableParameters -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VulnerableParameters -> r #

gmapQ :: (forall d. Data d => d -> u) -> VulnerableParameters -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VulnerableParameters -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VulnerableParameters -> m VulnerableParameters #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VulnerableParameters -> m VulnerableParameters #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VulnerableParameters -> m VulnerableParameters #

Show VulnerableParameters Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic VulnerableParameters Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep VulnerableParameters :: Type -> Type #

ToJSON VulnerableParameters Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON VulnerableParameters Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep VulnerableParameters Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep VulnerableParameters = D1 (MetaData "VulnerableParameters" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" True) (C1 (MetaCons "VulnerableParameters'" PrefixI True) (S1 (MetaSel (Just "_vpParameterNames") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Text]))))

vulnerableParameters :: VulnerableParameters Source #

Creates a value of VulnerableParameters with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

vpParameterNames :: Lens' VulnerableParameters [Text] Source #

The vulnerable parameter names.

CrawledURL

data CrawledURL Source #

A CrawledUrl resource represents a URL that was crawled during a ScanRun. Web Security Scanner Service crawls the web applications, following all links within the scope of sites, to find the URLs to test against.

See: crawledURL smart constructor.

Instances
Eq CrawledURL Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data CrawledURL Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CrawledURL -> c CrawledURL #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CrawledURL #

toConstr :: CrawledURL -> Constr #

dataTypeOf :: CrawledURL -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CrawledURL) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CrawledURL) #

gmapT :: (forall b. Data b => b -> b) -> CrawledURL -> CrawledURL #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CrawledURL -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CrawledURL -> r #

gmapQ :: (forall d. Data d => d -> u) -> CrawledURL -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CrawledURL -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CrawledURL -> m CrawledURL #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CrawledURL -> m CrawledURL #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CrawledURL -> m CrawledURL #

Show CrawledURL Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic CrawledURL Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep CrawledURL :: Type -> Type #

ToJSON CrawledURL Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON CrawledURL Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep CrawledURL Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep CrawledURL = D1 (MetaData "CrawledURL" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "CrawledURL'" PrefixI True) (S1 (MetaSel (Just "_cuHTTPMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_cuBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cuURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

crawledURL :: CrawledURL Source #

Creates a value of CrawledURL with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

cuHTTPMethod :: Lens' CrawledURL (Maybe Text) Source #

Output only. The http method of the request that was used to visit the URL, in uppercase.

cuBody :: Lens' CrawledURL (Maybe Text) Source #

Output only. The body of the request that was used to visit the URL.

cuURL :: Lens' CrawledURL (Maybe Text) Source #

Output only. The URL that was crawled.

OutdatedLibrary

data OutdatedLibrary Source #

Information reported for an outdated library.

See: outdatedLibrary smart constructor.

Instances
Eq OutdatedLibrary Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data OutdatedLibrary Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OutdatedLibrary -> c OutdatedLibrary #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OutdatedLibrary #

toConstr :: OutdatedLibrary -> Constr #

dataTypeOf :: OutdatedLibrary -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OutdatedLibrary) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OutdatedLibrary) #

gmapT :: (forall b. Data b => b -> b) -> OutdatedLibrary -> OutdatedLibrary #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OutdatedLibrary -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OutdatedLibrary -> r #

gmapQ :: (forall d. Data d => d -> u) -> OutdatedLibrary -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OutdatedLibrary -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OutdatedLibrary -> m OutdatedLibrary #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OutdatedLibrary -> m OutdatedLibrary #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OutdatedLibrary -> m OutdatedLibrary #

Show OutdatedLibrary Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic OutdatedLibrary Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep OutdatedLibrary :: Type -> Type #

ToJSON OutdatedLibrary Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON OutdatedLibrary Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep OutdatedLibrary Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep OutdatedLibrary = D1 (MetaData "OutdatedLibrary" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "OutdatedLibrary'" PrefixI True) (S1 (MetaSel (Just "_olLearnMoreURLs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_olVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_olLibraryName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

outdatedLibrary :: OutdatedLibrary Source #

Creates a value of OutdatedLibrary with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

olLearnMoreURLs :: Lens' OutdatedLibrary [Text] Source #

URLs to learn more information about the vulnerabilities in the library.

olVersion :: Lens' OutdatedLibrary (Maybe Text) Source #

The version number.

olLibraryName :: Lens' OutdatedLibrary (Maybe Text) Source #

The name of the outdated library.

ListScanRunsResponse

data ListScanRunsResponse Source #

Response for the `ListScanRuns` method.

See: listScanRunsResponse smart constructor.

Instances
Eq ListScanRunsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data ListScanRunsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ListScanRunsResponse -> c ListScanRunsResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ListScanRunsResponse #

toConstr :: ListScanRunsResponse -> Constr #

dataTypeOf :: ListScanRunsResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ListScanRunsResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ListScanRunsResponse) #

gmapT :: (forall b. Data b => b -> b) -> ListScanRunsResponse -> ListScanRunsResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ListScanRunsResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ListScanRunsResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ListScanRunsResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ListScanRunsResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ListScanRunsResponse -> m ListScanRunsResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ListScanRunsResponse -> m ListScanRunsResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ListScanRunsResponse -> m ListScanRunsResponse #

Show ListScanRunsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic ListScanRunsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep ListScanRunsResponse :: Type -> Type #

ToJSON ListScanRunsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON ListScanRunsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ListScanRunsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ListScanRunsResponse = D1 (MetaData "ListScanRunsResponse" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "ListScanRunsResponse'" PrefixI True) (S1 (MetaSel (Just "_lsrrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lsrrScanRuns") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ScanRun]))))

listScanRunsResponse :: ListScanRunsResponse Source #

Creates a value of ListScanRunsResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lsrrNextPageToken :: Lens' ListScanRunsResponse (Maybe Text) Source #

Token to retrieve the next page of results, or empty if there are no more results in the list.

lsrrScanRuns :: Lens' ListScanRunsResponse [ScanRun] Source #

The list of ScanRuns returned.

Header

data Header Source #

Describes a HTTP Header.

See: header smart constructor.

Instances
Eq Header Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

(==) :: Header -> Header -> Bool #

(/=) :: Header -> Header -> Bool #

Data Header Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Header -> c Header #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Header #

toConstr :: Header -> Constr #

dataTypeOf :: Header -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Header) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Header) #

gmapT :: (forall b. Data b => b -> b) -> Header -> Header #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Header -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Header -> r #

gmapQ :: (forall d. Data d => d -> u) -> Header -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Header -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Header -> m Header #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Header -> m Header #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Header -> m Header #

Show Header Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic Header Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep Header :: Type -> Type #

Methods

from :: Header -> Rep Header x #

to :: Rep Header x -> Header #

ToJSON Header Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON Header Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep Header Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep Header = D1 (MetaData "Header" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "Header'" PrefixI True) (S1 (MetaSel (Just "_hValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_hName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

header :: Header Source #

Creates a value of Header with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

hValue :: Lens' Header (Maybe Text) Source #

Header value.

hName :: Lens' Header (Maybe Text) Source #

Header name.

ScanRunErrorTrace

data ScanRunErrorTrace Source #

Output only. Defines an error trace message for a ScanRun.

See: scanRunErrorTrace smart constructor.

Instances
Eq ScanRunErrorTrace Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data ScanRunErrorTrace Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ScanRunErrorTrace -> c ScanRunErrorTrace #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ScanRunErrorTrace #

toConstr :: ScanRunErrorTrace -> Constr #

dataTypeOf :: ScanRunErrorTrace -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ScanRunErrorTrace) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ScanRunErrorTrace) #

gmapT :: (forall b. Data b => b -> b) -> ScanRunErrorTrace -> ScanRunErrorTrace #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ScanRunErrorTrace -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ScanRunErrorTrace -> r #

gmapQ :: (forall d. Data d => d -> u) -> ScanRunErrorTrace -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ScanRunErrorTrace -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ScanRunErrorTrace -> m ScanRunErrorTrace #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanRunErrorTrace -> m ScanRunErrorTrace #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanRunErrorTrace -> m ScanRunErrorTrace #

Show ScanRunErrorTrace Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic ScanRunErrorTrace Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep ScanRunErrorTrace :: Type -> Type #

ToJSON ScanRunErrorTrace Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON ScanRunErrorTrace Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ScanRunErrorTrace Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ScanRunErrorTrace = D1 (MetaData "ScanRunErrorTrace" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "ScanRunErrorTrace'" PrefixI True) (S1 (MetaSel (Just "_sretMostCommonHTTPErrorCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_sretScanConfigError") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ScanConfigError)) :*: S1 (MetaSel (Just "_sretCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ScanRunErrorTraceCode)))))

scanRunErrorTrace :: ScanRunErrorTrace Source #

Creates a value of ScanRunErrorTrace with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

sretMostCommonHTTPErrorCode :: Lens' ScanRunErrorTrace (Maybe Int32) Source #

Output only. If the scan encounters TOO_MANY_HTTP_ERRORS, this field indicates the most common HTTP error code, if such is available. For example, if this code is 404, the scan has encountered too many NOT_FOUND responses.

sretScanConfigError :: Lens' ScanRunErrorTrace (Maybe ScanConfigError) Source #

Output only. If the scan encounters SCAN_CONFIG_ISSUE error, this field has the error message encountered during scan configuration validation that is performed before each scan run.

sretCode :: Lens' ScanRunErrorTrace (Maybe ScanRunErrorTraceCode) Source #

Output only. Indicates the error reason code.

ListScanConfigsResponse

data ListScanConfigsResponse Source #

Response for the `ListScanConfigs` method.

See: listScanConfigsResponse smart constructor.

Instances
Eq ListScanConfigsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data ListScanConfigsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ListScanConfigsResponse -> c ListScanConfigsResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ListScanConfigsResponse #

toConstr :: ListScanConfigsResponse -> Constr #

dataTypeOf :: ListScanConfigsResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ListScanConfigsResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ListScanConfigsResponse) #

gmapT :: (forall b. Data b => b -> b) -> ListScanConfigsResponse -> ListScanConfigsResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ListScanConfigsResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ListScanConfigsResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> ListScanConfigsResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ListScanConfigsResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ListScanConfigsResponse -> m ListScanConfigsResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ListScanConfigsResponse -> m ListScanConfigsResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ListScanConfigsResponse -> m ListScanConfigsResponse #

Show ListScanConfigsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic ListScanConfigsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep ListScanConfigsResponse :: Type -> Type #

ToJSON ListScanConfigsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON ListScanConfigsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ListScanConfigsResponse Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ListScanConfigsResponse = D1 (MetaData "ListScanConfigsResponse" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "ListScanConfigsResponse'" PrefixI True) (S1 (MetaSel (Just "_lscrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lscrScanConfigs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ScanConfig]))))

listScanConfigsResponse :: ListScanConfigsResponse Source #

Creates a value of ListScanConfigsResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

lscrNextPageToken :: Lens' ListScanConfigsResponse (Maybe Text) Source #

Token to retrieve the next page of results, or empty if there are no more results in the list.

lscrScanConfigs :: Lens' ListScanConfigsResponse [ScanConfig] Source #

The list of ScanConfigs returned.

StartScanRunRequest

data StartScanRunRequest Source #

Request for the `StartScanRun` method.

See: startScanRunRequest smart constructor.

Instances
Eq StartScanRunRequest Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data StartScanRunRequest Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> StartScanRunRequest -> c StartScanRunRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c StartScanRunRequest #

toConstr :: StartScanRunRequest -> Constr #

dataTypeOf :: StartScanRunRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c StartScanRunRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c StartScanRunRequest) #

gmapT :: (forall b. Data b => b -> b) -> StartScanRunRequest -> StartScanRunRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> StartScanRunRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> StartScanRunRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> StartScanRunRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> StartScanRunRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> StartScanRunRequest -> m StartScanRunRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> StartScanRunRequest -> m StartScanRunRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> StartScanRunRequest -> m StartScanRunRequest #

Show StartScanRunRequest Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic StartScanRunRequest Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep StartScanRunRequest :: Type -> Type #

ToJSON StartScanRunRequest Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON StartScanRunRequest Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep StartScanRunRequest Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep StartScanRunRequest = D1 (MetaData "StartScanRunRequest" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "StartScanRunRequest'" PrefixI False) (U1 :: Type -> Type))

startScanRunRequest :: StartScanRunRequest Source #

Creates a value of StartScanRunRequest with the minimum fields required to make a request.

Xgafv

data Xgafv Source #

V1 error format.

Constructors

X1

1 v1 error format

X2

2 v2 error format

Instances
Enum Xgafv Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Eq Xgafv Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Methods

(==) :: Xgafv -> Xgafv -> Bool #

(/=) :: Xgafv -> Xgafv -> Bool #

Data Xgafv Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Xgafv -> c Xgafv #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Xgafv #

toConstr :: Xgafv -> Constr #

dataTypeOf :: Xgafv -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Xgafv) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Xgafv) #

gmapT :: (forall b. Data b => b -> b) -> Xgafv -> Xgafv #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Xgafv -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Xgafv -> r #

gmapQ :: (forall d. Data d => d -> u) -> Xgafv -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Xgafv -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Xgafv -> m Xgafv #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Xgafv -> m Xgafv #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Xgafv -> m Xgafv #

Ord Xgafv Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Methods

compare :: Xgafv -> Xgafv -> Ordering #

(<) :: Xgafv -> Xgafv -> Bool #

(<=) :: Xgafv -> Xgafv -> Bool #

(>) :: Xgafv -> Xgafv -> Bool #

(>=) :: Xgafv -> Xgafv -> Bool #

max :: Xgafv -> Xgafv -> Xgafv #

min :: Xgafv -> Xgafv -> Xgafv #

Read Xgafv Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Show Xgafv Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Associated Types

type Rep Xgafv :: Type -> Type #

Methods

from :: Xgafv -> Rep Xgafv x #

to :: Rep Xgafv x -> Xgafv #

Hashable Xgafv Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.WebSecurityScanner.Types.Sum" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "X1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "X2" PrefixI False) (U1 :: Type -> Type))

CustomAccount

data CustomAccount Source #

Describes authentication configuration that uses a custom account.

See: customAccount smart constructor.

Instances
Eq CustomAccount Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data CustomAccount Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CustomAccount -> c CustomAccount #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CustomAccount #

toConstr :: CustomAccount -> Constr #

dataTypeOf :: CustomAccount -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CustomAccount) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CustomAccount) #

gmapT :: (forall b. Data b => b -> b) -> CustomAccount -> CustomAccount #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CustomAccount -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CustomAccount -> r #

gmapQ :: (forall d. Data d => d -> u) -> CustomAccount -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CustomAccount -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CustomAccount -> m CustomAccount #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CustomAccount -> m CustomAccount #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CustomAccount -> m CustomAccount #

Show CustomAccount Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic CustomAccount Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep CustomAccount :: Type -> Type #

ToJSON CustomAccount Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON CustomAccount Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep CustomAccount Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep CustomAccount = D1 (MetaData "CustomAccount" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "CustomAccount'" PrefixI True) (S1 (MetaSel (Just "_caLoginURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_caUsername") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_caPassword") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

customAccount :: CustomAccount Source #

Creates a value of CustomAccount with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

caLoginURL :: Lens' CustomAccount (Maybe Text) Source #

Required. The login form URL of the website.

caUsername :: Lens' CustomAccount (Maybe Text) Source #

Required. The user name of the custom account.

caPassword :: Lens' CustomAccount (Maybe Text) Source #

Input only. Required. The password of the custom account. The credential is stored encrypted and not returned in any response nor included in audit logs.

ScanConfigUserAgent

data ScanConfigUserAgent Source #

The user agent used during scanning.

Constructors

UserAgentUnspecified

USER_AGENT_UNSPECIFIED The user agent is unknown. Service will default to CHROME_LINUX.

ChromeLinux

CHROME_LINUX Chrome on Linux. This is the service default if unspecified.

ChromeAndroid

CHROME_ANDROID Chrome on Android.

SafariIPhone

SAFARI_IPHONE Safari on IPhone.

Instances
Enum ScanConfigUserAgent Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Eq ScanConfigUserAgent Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Data ScanConfigUserAgent Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ScanConfigUserAgent -> c ScanConfigUserAgent #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ScanConfigUserAgent #

toConstr :: ScanConfigUserAgent -> Constr #

dataTypeOf :: ScanConfigUserAgent -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ScanConfigUserAgent) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ScanConfigUserAgent) #

gmapT :: (forall b. Data b => b -> b) -> ScanConfigUserAgent -> ScanConfigUserAgent #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ScanConfigUserAgent -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ScanConfigUserAgent -> r #

gmapQ :: (forall d. Data d => d -> u) -> ScanConfigUserAgent -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ScanConfigUserAgent -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ScanConfigUserAgent -> m ScanConfigUserAgent #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanConfigUserAgent -> m ScanConfigUserAgent #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanConfigUserAgent -> m ScanConfigUserAgent #

Ord ScanConfigUserAgent Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Read ScanConfigUserAgent Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Show ScanConfigUserAgent Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Generic ScanConfigUserAgent Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Associated Types

type Rep ScanConfigUserAgent :: Type -> Type #

Hashable ScanConfigUserAgent Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

ToJSON ScanConfigUserAgent Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

FromJSON ScanConfigUserAgent Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

FromHttpApiData ScanConfigUserAgent Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

ToHttpApiData ScanConfigUserAgent Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

type Rep ScanConfigUserAgent Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

type Rep ScanConfigUserAgent = D1 (MetaData "ScanConfigUserAgent" "Network.Google.WebSecurityScanner.Types.Sum" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) ((C1 (MetaCons "UserAgentUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ChromeLinux" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "ChromeAndroid" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SafariIPhone" PrefixI False) (U1 :: Type -> Type)))

ScanConfig

data ScanConfig Source #

A ScanConfig resource contains the configurations to launch a scan. next id: 12

See: scanConfig smart constructor.

Instances
Eq ScanConfig Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data ScanConfig Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ScanConfig -> c ScanConfig #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ScanConfig #

toConstr :: ScanConfig -> Constr #

dataTypeOf :: ScanConfig -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ScanConfig) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ScanConfig) #

gmapT :: (forall b. Data b => b -> b) -> ScanConfig -> ScanConfig #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ScanConfig -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ScanConfig -> r #

gmapQ :: (forall d. Data d => d -> u) -> ScanConfig -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ScanConfig -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ScanConfig -> m ScanConfig #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanConfig -> m ScanConfig #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanConfig -> m ScanConfig #

Show ScanConfig Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic ScanConfig Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep ScanConfig :: Type -> Type #

ToJSON ScanConfig Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON ScanConfig Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ScanConfig Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ScanConfig = D1 (MetaData "ScanConfig" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "ScanConfig'" PrefixI True) (((S1 (MetaSel (Just "_scLatestRun") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ScanRun)) :*: S1 (MetaSel (Just "_scSchedule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Schedule))) :*: (S1 (MetaSel (Just "_scTargetPlatforms") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_scStartingURLs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_scAuthentication") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Authentication))))) :*: ((S1 (MetaSel (Just "_scMaxQps") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_scName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_scExportToSecurityCommandCenter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ScanConfigExportToSecurityCommandCenter)))) :*: (S1 (MetaSel (Just "_scDisplayName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_scUserAgent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ScanConfigUserAgent)) :*: S1 (MetaSel (Just "_scBlackListPatterns") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))))))

scanConfig :: ScanConfig Source #

Creates a value of ScanConfig with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

scLatestRun :: Lens' ScanConfig (Maybe ScanRun) Source #

Latest ScanRun if available.

scSchedule :: Lens' ScanConfig (Maybe Schedule) Source #

The schedule of the ScanConfig.

scTargetPlatforms :: Lens' ScanConfig [Text] Source #

Set of Cloud Platforms targeted by the scan. If empty, APP_ENGINE will be used as a default.

scStartingURLs :: Lens' ScanConfig [Text] Source #

Required. The starting URLs from which the scanner finds site pages.

scAuthentication :: Lens' ScanConfig (Maybe Authentication) Source #

The authentication configuration. If specified, service will use the authentication configuration during scanning.

scMaxQps :: Lens' ScanConfig (Maybe Int32) Source #

The maximum QPS during scanning. A valid value ranges from 5 to 20 inclusively. If the field is unspecified or its value is set 0, server will default to 15. Other values outside of [5, 20] range will be rejected with INVALID_ARGUMENT error.

scName :: Lens' ScanConfig (Maybe Text) Source #

The resource name of the ScanConfig. The name follows the format of 'projects/{projectId}/scanConfigs/{scanConfigId}'. The ScanConfig IDs are generated by the system.

scExportToSecurityCommandCenter :: Lens' ScanConfig (Maybe ScanConfigExportToSecurityCommandCenter) Source #

Controls export of scan configurations and results to Cloud Security Command Center.

scDisplayName :: Lens' ScanConfig (Maybe Text) Source #

Required. The user provided display name of the ScanConfig.

scUserAgent :: Lens' ScanConfig (Maybe ScanConfigUserAgent) Source #

The user agent used during scanning.

scBlackListPatterns :: Lens' ScanConfig [Text] Source #

The blacklist URL patterns as described in https://cloud.google.com/security-scanner/docs/excluded-urls

ScanRunWarningTraceCode

data ScanRunWarningTraceCode Source #

Output only. Indicates the warning code.

Constructors

SRWTCCodeUnspecified

CODE_UNSPECIFIED Default value is never used.

SRWTCInsufficientCrawlResults

INSUFFICIENT_CRAWL_RESULTS Indicates that a scan discovered an unexpectedly low number of URLs. This is sometimes caused by complex navigation features or by using a single URL for numerous pages.

SRWTCTooManyCrawlResults

TOO_MANY_CRAWL_RESULTS Indicates that a scan discovered too many URLs to test, or excessive redundant URLs.

SRWTCTooManyFuzzTasks

TOO_MANY_FUZZ_TASKS Indicates that too many tests have been generated for the scan. Customer should try reducing the number of starting URLs, increasing the QPS rate, or narrowing down the scope of the scan using the excluded patterns.

SRWTCBlockedByIap

BLOCKED_BY_IAP Indicates that a scan is blocked by IAP.

Instances
Enum ScanRunWarningTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Eq ScanRunWarningTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Data ScanRunWarningTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ScanRunWarningTraceCode -> c ScanRunWarningTraceCode #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ScanRunWarningTraceCode #

toConstr :: ScanRunWarningTraceCode -> Constr #

dataTypeOf :: ScanRunWarningTraceCode -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ScanRunWarningTraceCode) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ScanRunWarningTraceCode) #

gmapT :: (forall b. Data b => b -> b) -> ScanRunWarningTraceCode -> ScanRunWarningTraceCode #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ScanRunWarningTraceCode -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ScanRunWarningTraceCode -> r #

gmapQ :: (forall d. Data d => d -> u) -> ScanRunWarningTraceCode -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ScanRunWarningTraceCode -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ScanRunWarningTraceCode -> m ScanRunWarningTraceCode #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanRunWarningTraceCode -> m ScanRunWarningTraceCode #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanRunWarningTraceCode -> m ScanRunWarningTraceCode #

Ord ScanRunWarningTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Read ScanRunWarningTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Show ScanRunWarningTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Generic ScanRunWarningTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Associated Types

type Rep ScanRunWarningTraceCode :: Type -> Type #

Hashable ScanRunWarningTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

ToJSON ScanRunWarningTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

FromJSON ScanRunWarningTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

FromHttpApiData ScanRunWarningTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

ToHttpApiData ScanRunWarningTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

type Rep ScanRunWarningTraceCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

type Rep ScanRunWarningTraceCode = D1 (MetaData "ScanRunWarningTraceCode" "Network.Google.WebSecurityScanner.Types.Sum" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) ((C1 (MetaCons "SRWTCCodeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SRWTCInsufficientCrawlResults" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "SRWTCTooManyCrawlResults" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SRWTCTooManyFuzzTasks" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SRWTCBlockedByIap" PrefixI False) (U1 :: Type -> Type))))

ScanConfigExportToSecurityCommandCenter

data ScanConfigExportToSecurityCommandCenter Source #

Controls export of scan configurations and results to Cloud Security Command Center.

Constructors

ExportToSecurityCommandCenterUnspecified

EXPORT_TO_SECURITY_COMMAND_CENTER_UNSPECIFIED Use default, which is ENABLED.

Enabled

ENABLED Export results of this scan to Cloud Security Command Center.

Disabled

DISABLED Do not export results of this scan to Cloud Security Command Center.

Instances
Enum ScanConfigExportToSecurityCommandCenter Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Eq ScanConfigExportToSecurityCommandCenter Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Data ScanConfigExportToSecurityCommandCenter Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ScanConfigExportToSecurityCommandCenter -> c ScanConfigExportToSecurityCommandCenter #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ScanConfigExportToSecurityCommandCenter #

toConstr :: ScanConfigExportToSecurityCommandCenter -> Constr #

dataTypeOf :: ScanConfigExportToSecurityCommandCenter -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ScanConfigExportToSecurityCommandCenter) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ScanConfigExportToSecurityCommandCenter) #

gmapT :: (forall b. Data b => b -> b) -> ScanConfigExportToSecurityCommandCenter -> ScanConfigExportToSecurityCommandCenter #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ScanConfigExportToSecurityCommandCenter -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ScanConfigExportToSecurityCommandCenter -> r #

gmapQ :: (forall d. Data d => d -> u) -> ScanConfigExportToSecurityCommandCenter -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ScanConfigExportToSecurityCommandCenter -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ScanConfigExportToSecurityCommandCenter -> m ScanConfigExportToSecurityCommandCenter #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanConfigExportToSecurityCommandCenter -> m ScanConfigExportToSecurityCommandCenter #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanConfigExportToSecurityCommandCenter -> m ScanConfigExportToSecurityCommandCenter #

Ord ScanConfigExportToSecurityCommandCenter Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Read ScanConfigExportToSecurityCommandCenter Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Show ScanConfigExportToSecurityCommandCenter Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Generic ScanConfigExportToSecurityCommandCenter Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Hashable ScanConfigExportToSecurityCommandCenter Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

ToJSON ScanConfigExportToSecurityCommandCenter Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

FromJSON ScanConfigExportToSecurityCommandCenter Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

FromHttpApiData ScanConfigExportToSecurityCommandCenter Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

ToHttpApiData ScanConfigExportToSecurityCommandCenter Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

type Rep ScanConfigExportToSecurityCommandCenter Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

type Rep ScanConfigExportToSecurityCommandCenter = D1 (MetaData "ScanConfigExportToSecurityCommandCenter" "Network.Google.WebSecurityScanner.Types.Sum" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "ExportToSecurityCommandCenterUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Enabled" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Disabled" PrefixI False) (U1 :: Type -> Type)))

ScanConfigErrorCode

data ScanConfigErrorCode Source #

Output only. Indicates the reason code for a configuration failure.

Constructors

SCECCodeUnspecified

CODE_UNSPECIFIED There is no error.

SCECOK

OK There is no error.

SCECInternalError

INTERNAL_ERROR Indicates an internal server error. Please DO NOT USE THIS ERROR CODE unless the root cause is truly unknown.

SCECAppEngineAPIBackendError

APPENGINE_API_BACKEND_ERROR One of the seed URLs is an App Engine URL but we cannot validate the scan settings due to an App Engine API backend error.

SCECAppEngineAPINotAccessible

APPENGINE_API_NOT_ACCESSIBLE One of the seed URLs is an App Engine URL but we cannot access the App Engine API to validate scan settings.

SCECAppEngineDefaultHostMissing

APPENGINE_DEFAULT_HOST_MISSING One of the seed URLs is an App Engine URL but the Default Host of the App Engine is not set.

SCECAppEngineSeedURLNotAllowed

APPENGINE_SEED_URL_NOT_ALLOWED One of the seed URLs is an App Engine URL and the scan targets Compute Engine only.

SCECCannotUseGoogleComAccount

CANNOT_USE_GOOGLE_COM_ACCOUNT Google corporate accounts can not be used for scanning.

SCECCannotUseOwnerAccount

CANNOT_USE_OWNER_ACCOUNT The account of the scan creator can not be used for scanning.

SCECComputeAPIBackendError

COMPUTE_API_BACKEND_ERROR This scan targets Compute Engine, but we cannot validate scan settings due to a Compute Engine API backend error.

SCECComputeAPINotAccessible

COMPUTE_API_NOT_ACCESSIBLE This scan targets Compute Engine, but we cannot access the Compute Engine API to validate the scan settings.

SCECCustomLoginURLDoesNotBelongToCurrentProject

CUSTOM_LOGIN_URL_DOES_NOT_BELONG_TO_CURRENT_PROJECT The Custom Login URL does not belong to the current project.

SCECCustomLoginURLMalformed

CUSTOM_LOGIN_URL_MALFORMED The Custom Login URL is malformed (can not be parsed).

SCECCustomLoginURLMAppedToNonRoutableAddress

CUSTOM_LOGIN_URL_MAPPED_TO_NON_ROUTABLE_ADDRESS The Custom Login URL is mapped to a non-routable IP address in DNS.

SCECCustomLoginURLMAppedToUnreservedAddress

CUSTOM_LOGIN_URL_MAPPED_TO_UNRESERVED_ADDRESS The Custom Login URL is mapped to an IP address which is not reserved for the current project.

SCECCustomLoginURLHasNonRoutableIPAddress

CUSTOM_LOGIN_URL_HAS_NON_ROUTABLE_IP_ADDRESS The Custom Login URL has a non-routable IP address.

SCECCustomLoginURLHasUnreservedIPAddress

CUSTOM_LOGIN_URL_HAS_UNRESERVED_IP_ADDRESS The Custom Login URL has an IP address which is not reserved for the current project.

SCECDuplicateScanName

DUPLICATE_SCAN_NAME Another scan with the same name (case-sensitive) already exists.

SCECInvalidFieldValue

INVALID_FIELD_VALUE A field is set to an invalid value.

SCECFailedToAuthenticateToTarget

FAILED_TO_AUTHENTICATE_TO_TARGET There was an error trying to authenticate to the scan target.

SCECFindingTypeUnspecified

FINDING_TYPE_UNSPECIFIED Finding type value is not specified in the list findings request.

SCECForBiddenToScanCompute

FORBIDDEN_TO_SCAN_COMPUTE Scan targets Compute Engine, yet current project was not whitelisted for Google Compute Engine Scanning Alpha access.

SCECMalformedFilter

MALFORMED_FILTER The supplied filter is malformed. For example, it can not be parsed, does not have a filter type in expression, or the same filter type appears more than once.

SCECMalformedResourceName

MALFORMED_RESOURCE_NAME The supplied resource name is malformed (can not be parsed).

SCECProjectInactive

PROJECT_INACTIVE The current project is not in an active state.

SCECRequiredField

REQUIRED_FIELD A required field is not set.

SCECResourceNameInconsistent

RESOURCE_NAME_INCONSISTENT Project id, scanconfig id, scanrun id, or finding id are not consistent with each other in resource name.

SCECScanAlreadyRunning

SCAN_ALREADY_RUNNING The scan being requested to start is already running.

SCECScanNotRunning

SCAN_NOT_RUNNING The scan that was requested to be stopped is not running.

SCECSeedURLDoesNotBelongToCurrentProject

SEED_URL_DOES_NOT_BELONG_TO_CURRENT_PROJECT One of the seed URLs does not belong to the current project.

SCECSeedURLMalformed

SEED_URL_MALFORMED One of the seed URLs is malformed (can not be parsed).

SCECSeedURLMAppedToNonRoutableAddress

SEED_URL_MAPPED_TO_NON_ROUTABLE_ADDRESS One of the seed URLs is mapped to a non-routable IP address in DNS.

SCECSeedURLMAppedToUnreservedAddress

SEED_URL_MAPPED_TO_UNRESERVED_ADDRESS One of the seed URLs is mapped to an IP address which is not reserved for the current project.

SCECSeedURLHasNonRoutableIPAddress

SEED_URL_HAS_NON_ROUTABLE_IP_ADDRESS One of the seed URLs has on-routable IP address.

SCECSeedURLIPAddressNotSupportedForAppEngine

SEED_URL_IP_ADDRESS_NOT_SUPPORTED_FOR_APPENGINE One of the supplied seed URLs has an IP address, and this is not supported in App Engine-only targeted scan.

SCECSeedURLHasUnreservedIPAddress

SEED_URL_HAS_UNRESERVED_IP_ADDRESS One of the seed URLs has an IP address that is not reserved for the current project.

SCECServiceAccountNotConfigured

SERVICE_ACCOUNT_NOT_CONFIGURED The Cloud Security Scanner service account is not configured under the project.

SCECTooManyScans

TOO_MANY_SCANS A project has reached the maximum number of scans.

SCECUnableToResolveProjectInfo

UNABLE_TO_RESOLVE_PROJECT_INFO Resolving the details of the current project fails.

SCECUnsupportedBlackListPatternFormat

UNSUPPORTED_BLACKLIST_PATTERN_FORMAT One or more blacklist patterns were in the wrong format.

SCECUnsupportedFilter

UNSUPPORTED_FILTER The supplied filter is not supported.

SCECUnsupportedFindingType

UNSUPPORTED_FINDING_TYPE The supplied finding type is not supported. For example, we do not provide findings of the given finding type.

SCECUnsupportedURLScheme

UNSUPPORTED_URL_SCHEME The URL scheme of one or more of the supplied URLs is not supported.

Instances
Enum ScanConfigErrorCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Eq ScanConfigErrorCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Data ScanConfigErrorCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ScanConfigErrorCode -> c ScanConfigErrorCode #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ScanConfigErrorCode #

toConstr :: ScanConfigErrorCode -> Constr #

dataTypeOf :: ScanConfigErrorCode -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ScanConfigErrorCode) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ScanConfigErrorCode) #

gmapT :: (forall b. Data b => b -> b) -> ScanConfigErrorCode -> ScanConfigErrorCode #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ScanConfigErrorCode -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ScanConfigErrorCode -> r #

gmapQ :: (forall d. Data d => d -> u) -> ScanConfigErrorCode -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ScanConfigErrorCode -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ScanConfigErrorCode -> m ScanConfigErrorCode #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanConfigErrorCode -> m ScanConfigErrorCode #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanConfigErrorCode -> m ScanConfigErrorCode #

Ord ScanConfigErrorCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Read ScanConfigErrorCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Show ScanConfigErrorCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Generic ScanConfigErrorCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Associated Types

type Rep ScanConfigErrorCode :: Type -> Type #

Hashable ScanConfigErrorCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

ToJSON ScanConfigErrorCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

FromJSON ScanConfigErrorCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

FromHttpApiData ScanConfigErrorCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

ToHttpApiData ScanConfigErrorCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

type Rep ScanConfigErrorCode Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

type Rep ScanConfigErrorCode = D1 (MetaData "ScanConfigErrorCode" "Network.Google.WebSecurityScanner.Types.Sum" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (((((C1 (MetaCons "SCECCodeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SCECOK" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "SCECInternalError" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SCECAppEngineAPIBackendError" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SCECAppEngineAPINotAccessible" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "SCECAppEngineDefaultHostMissing" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SCECAppEngineSeedURLNotAllowed" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "SCECCannotUseGoogleComAccount" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SCECCannotUseOwnerAccount" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SCECComputeAPIBackendError" PrefixI False) (U1 :: Type -> Type))))) :+: (((C1 (MetaCons "SCECComputeAPINotAccessible" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SCECCustomLoginURLDoesNotBelongToCurrentProject" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "SCECCustomLoginURLMalformed" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SCECCustomLoginURLMAppedToNonRoutableAddress" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SCECCustomLoginURLMAppedToUnreservedAddress" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "SCECCustomLoginURLHasNonRoutableIPAddress" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SCECCustomLoginURLHasUnreservedIPAddress" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SCECDuplicateScanName" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "SCECInvalidFieldValue" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SCECFailedToAuthenticateToTarget" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SCECFindingTypeUnspecified" PrefixI False) (U1 :: Type -> Type)))))) :+: ((((C1 (MetaCons "SCECForBiddenToScanCompute" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SCECMalformedFilter" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "SCECMalformedResourceName" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SCECProjectInactive" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SCECRequiredField" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "SCECResourceNameInconsistent" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SCECScanAlreadyRunning" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SCECScanNotRunning" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "SCECSeedURLDoesNotBelongToCurrentProject" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SCECSeedURLMalformed" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SCECSeedURLMAppedToNonRoutableAddress" PrefixI False) (U1 :: Type -> Type))))) :+: (((C1 (MetaCons "SCECSeedURLMAppedToUnreservedAddress" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SCECSeedURLHasNonRoutableIPAddress" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "SCECSeedURLIPAddressNotSupportedForAppEngine" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SCECSeedURLHasUnreservedIPAddress" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SCECServiceAccountNotConfigured" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "SCECTooManyScans" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SCECUnableToResolveProjectInfo" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SCECUnsupportedBlackListPatternFormat" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "SCECUnsupportedFilter" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SCECUnsupportedFindingType" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SCECUnsupportedURLScheme" PrefixI False) (U1 :: Type -> Type)))))))

ScanRunResultState

data ScanRunResultState Source #

Output only. The result state of the ScanRun. This field is only available after the execution state reaches "FINISHED".

Constructors

ResultStateUnspecified

RESULT_STATE_UNSPECIFIED Default value. This value is returned when the ScanRun is not yet finished.

Success

SUCCESS The scan finished without errors.

Error'

ERROR The scan finished with errors.

Killed

KILLED The scan was terminated by user.

Instances
Enum ScanRunResultState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Eq ScanRunResultState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Data ScanRunResultState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ScanRunResultState -> c ScanRunResultState #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ScanRunResultState #

toConstr :: ScanRunResultState -> Constr #

dataTypeOf :: ScanRunResultState -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ScanRunResultState) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ScanRunResultState) #

gmapT :: (forall b. Data b => b -> b) -> ScanRunResultState -> ScanRunResultState #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ScanRunResultState -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ScanRunResultState -> r #

gmapQ :: (forall d. Data d => d -> u) -> ScanRunResultState -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ScanRunResultState -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ScanRunResultState -> m ScanRunResultState #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanRunResultState -> m ScanRunResultState #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanRunResultState -> m ScanRunResultState #

Ord ScanRunResultState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Read ScanRunResultState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Show ScanRunResultState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Generic ScanRunResultState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Associated Types

type Rep ScanRunResultState :: Type -> Type #

Hashable ScanRunResultState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

ToJSON ScanRunResultState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

FromJSON ScanRunResultState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

FromHttpApiData ScanRunResultState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

ToHttpApiData ScanRunResultState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

type Rep ScanRunResultState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

type Rep ScanRunResultState = D1 (MetaData "ScanRunResultState" "Network.Google.WebSecurityScanner.Types.Sum" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) ((C1 (MetaCons "ResultStateUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Success" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Error'" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Killed" PrefixI False) (U1 :: Type -> Type)))

VulnerableHeaders

data VulnerableHeaders Source #

Information about vulnerable or missing HTTP Headers.

See: vulnerableHeaders smart constructor.

Instances
Eq VulnerableHeaders Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data VulnerableHeaders Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VulnerableHeaders -> c VulnerableHeaders #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c VulnerableHeaders #

toConstr :: VulnerableHeaders -> Constr #

dataTypeOf :: VulnerableHeaders -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c VulnerableHeaders) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c VulnerableHeaders) #

gmapT :: (forall b. Data b => b -> b) -> VulnerableHeaders -> VulnerableHeaders #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VulnerableHeaders -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VulnerableHeaders -> r #

gmapQ :: (forall d. Data d => d -> u) -> VulnerableHeaders -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VulnerableHeaders -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VulnerableHeaders -> m VulnerableHeaders #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VulnerableHeaders -> m VulnerableHeaders #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VulnerableHeaders -> m VulnerableHeaders #

Show VulnerableHeaders Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic VulnerableHeaders Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep VulnerableHeaders :: Type -> Type #

ToJSON VulnerableHeaders Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON VulnerableHeaders Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep VulnerableHeaders Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep VulnerableHeaders = D1 (MetaData "VulnerableHeaders" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "VulnerableHeaders'" PrefixI True) (S1 (MetaSel (Just "_vhMissingHeaders") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Header])) :*: S1 (MetaSel (Just "_vhHeaders") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Header]))))

vulnerableHeaders :: VulnerableHeaders Source #

Creates a value of VulnerableHeaders with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

vhMissingHeaders :: Lens' VulnerableHeaders [Header] Source #

List of missing headers.

vhHeaders :: Lens' VulnerableHeaders [Header] Source #

List of vulnerable headers.

ViolatingResource

data ViolatingResource Source #

Information regarding any resource causing the vulnerability such as JavaScript sources, image, audio files, etc.

See: violatingResource smart constructor.

Instances
Eq ViolatingResource Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Data ViolatingResource Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ViolatingResource -> c ViolatingResource #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ViolatingResource #

toConstr :: ViolatingResource -> Constr #

dataTypeOf :: ViolatingResource -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ViolatingResource) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ViolatingResource) #

gmapT :: (forall b. Data b => b -> b) -> ViolatingResource -> ViolatingResource #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ViolatingResource -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ViolatingResource -> r #

gmapQ :: (forall d. Data d => d -> u) -> ViolatingResource -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ViolatingResource -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ViolatingResource -> m ViolatingResource #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ViolatingResource -> m ViolatingResource #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ViolatingResource -> m ViolatingResource #

Show ViolatingResource Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic ViolatingResource Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep ViolatingResource :: Type -> Type #

ToJSON ViolatingResource Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON ViolatingResource Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ViolatingResource Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ViolatingResource = D1 (MetaData "ViolatingResource" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "ViolatingResource'" PrefixI True) (S1 (MetaSel (Just "_vrContentType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_vrResourceURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

violatingResource :: ViolatingResource Source #

Creates a value of ViolatingResource with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

vrContentType :: Lens' ViolatingResource (Maybe Text) Source #

The MIME type of this resource.

vrResourceURL :: Lens' ViolatingResource (Maybe Text) Source #

URL of this violating resource.

ScanRunExecutionState

data ScanRunExecutionState Source #

Output only. The execution state of the ScanRun.

Constructors

ExecutionStateUnspecified

EXECUTION_STATE_UNSPECIFIED Represents an invalid state caused by internal server error. This value should never be returned.

Queued

QUEUED The scan is waiting in the queue.

Scanning

SCANNING The scan is in progress.

Finished

FINISHED The scan is either finished or stopped by user.

Instances
Enum ScanRunExecutionState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Eq ScanRunExecutionState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Data ScanRunExecutionState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ScanRunExecutionState -> c ScanRunExecutionState #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ScanRunExecutionState #

toConstr :: ScanRunExecutionState -> Constr #

dataTypeOf :: ScanRunExecutionState -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ScanRunExecutionState) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ScanRunExecutionState) #

gmapT :: (forall b. Data b => b -> b) -> ScanRunExecutionState -> ScanRunExecutionState #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ScanRunExecutionState -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ScanRunExecutionState -> r #

gmapQ :: (forall d. Data d => d -> u) -> ScanRunExecutionState -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ScanRunExecutionState -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ScanRunExecutionState -> m ScanRunExecutionState #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanRunExecutionState -> m ScanRunExecutionState #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanRunExecutionState -> m ScanRunExecutionState #

Ord ScanRunExecutionState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Read ScanRunExecutionState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Show ScanRunExecutionState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Generic ScanRunExecutionState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

Associated Types

type Rep ScanRunExecutionState :: Type -> Type #

Hashable ScanRunExecutionState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

ToJSON ScanRunExecutionState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

FromJSON ScanRunExecutionState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

FromHttpApiData ScanRunExecutionState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

ToHttpApiData ScanRunExecutionState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

type Rep ScanRunExecutionState Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Sum

type Rep ScanRunExecutionState = D1 (MetaData "ScanRunExecutionState" "Network.Google.WebSecurityScanner.Types.Sum" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) ((C1 (MetaCons "ExecutionStateUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Queued" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Scanning" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Finished" PrefixI False) (U1 :: Type -> Type)))

Form

data Form Source #

! Information about a vulnerability with an HTML.

See: form smart constructor.

Instances
Eq Form Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

(==) :: Form -> Form -> Bool #

(/=) :: Form -> Form -> Bool #

Data Form Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Form -> c Form #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Form #

toConstr :: Form -> Constr #

dataTypeOf :: Form -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Form) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Form) #

gmapT :: (forall b. Data b => b -> b) -> Form -> Form #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Form -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Form -> r #

gmapQ :: (forall d. Data d => d -> u) -> Form -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Form -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Form -> m Form #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Form -> m Form #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Form -> m Form #

Show Form Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

showsPrec :: Int -> Form -> ShowS #

show :: Form -> String #

showList :: [Form] -> ShowS #

Generic Form Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep Form :: Type -> Type #

Methods

from :: Form -> Rep Form x #

to :: Rep Form x -> Form #

ToJSON Form Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON Form Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep Form Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep Form = D1 (MetaData "Form" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "Form'" PrefixI True) (S1 (MetaSel (Just "_fActionURI") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_fFields") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))))

form :: Form Source #

Creates a value of Form with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

fActionURI :: Lens' Form (Maybe Text) Source #

! The URI where to send the form when it's submitted.

fFields :: Lens' Form [Text] Source #

! The names of form fields related to the vulnerability.

ScanRun

data ScanRun Source #

A ScanRun is a output-only resource representing an actual run of the scan. Next id: 12

See: scanRun smart constructor.

Instances
Eq ScanRun Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

(==) :: ScanRun -> ScanRun -> Bool #

(/=) :: ScanRun -> ScanRun -> Bool #

Data ScanRun Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ScanRun -> c ScanRun #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ScanRun #

toConstr :: ScanRun -> Constr #

dataTypeOf :: ScanRun -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ScanRun) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ScanRun) #

gmapT :: (forall b. Data b => b -> b) -> ScanRun -> ScanRun #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ScanRun -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ScanRun -> r #

gmapQ :: (forall d. Data d => d -> u) -> ScanRun -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ScanRun -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ScanRun -> m ScanRun #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanRun -> m ScanRun #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ScanRun -> m ScanRun #

Show ScanRun Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Generic ScanRun Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

Associated Types

type Rep ScanRun :: Type -> Type #

Methods

from :: ScanRun -> Rep ScanRun x #

to :: Rep ScanRun x -> ScanRun #

ToJSON ScanRun Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

FromJSON ScanRun Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ScanRun Source # 
Instance details

Defined in Network.Google.WebSecurityScanner.Types.Product

type Rep ScanRun = D1 (MetaData "ScanRun" "Network.Google.WebSecurityScanner.Types.Product" "gogol-websecurityscanner-0.5.0-e0ydSHOVAJ6GE1G5P38Yh" False) (C1 (MetaCons "ScanRun'" PrefixI True) (((S1 (MetaSel (Just "_srStartTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_srHasVulnerabilities") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) :*: (S1 (MetaSel (Just "_srWarningTraces") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ScanRunWarningTrace])) :*: (S1 (MetaSel (Just "_srResultState") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ScanRunResultState)) :*: S1 (MetaSel (Just "_srProgressPercent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))) :*: ((S1 (MetaSel (Just "_srURLsCrawledCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: (S1 (MetaSel (Just "_srURLsTestedCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_srName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_srEndTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: (S1 (MetaSel (Just "_srExecutionState") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ScanRunExecutionState)) :*: S1 (MetaSel (Just "_srErrorTrace") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ScanRunErrorTrace)))))))

scanRun :: ScanRun Source #

Creates a value of ScanRun with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

srStartTime :: Lens' ScanRun (Maybe UTCTime) Source #

Output only. The time at which the ScanRun started.

srHasVulnerabilities :: Lens' ScanRun (Maybe Bool) Source #

Output only. Whether the scan run has found any vulnerabilities.

srWarningTraces :: Lens' ScanRun [ScanRunWarningTrace] Source #

Output only. A list of warnings, if such are encountered during this scan run.

srResultState :: Lens' ScanRun (Maybe ScanRunResultState) Source #

Output only. The result state of the ScanRun. This field is only available after the execution state reaches "FINISHED".

srProgressPercent :: Lens' ScanRun (Maybe Int32) Source #

Output only. The percentage of total completion ranging from 0 to 100. If the scan is in queue, the value is 0. If the scan is running, the value ranges from 0 to 100. If the scan is finished, the value is 100.

srURLsCrawledCount :: Lens' ScanRun (Maybe Int64) Source #

Output only. The number of URLs crawled during this ScanRun. If the scan is in progress, the value represents the number of URLs crawled up to now.

srURLsTestedCount :: Lens' ScanRun (Maybe Int64) Source #

Output only. The number of URLs tested during this ScanRun. If the scan is in progress, the value represents the number of URLs tested up to now. The number of URLs tested is usually larger than the number URLS crawled because typically a crawled URL is tested with multiple test payloads.

srName :: Lens' ScanRun (Maybe Text) Source #

Output only. The resource name of the ScanRun. The name follows the format of 'projects/{projectId}/scanConfigs/{scanConfigId}/scanRuns/{scanRunId}'. The ScanRun IDs are generated by the system.

srEndTime :: Lens' ScanRun (Maybe UTCTime) Source #

Output only. The time at which the ScanRun reached termination state - that the ScanRun is either finished or stopped by user.

srExecutionState :: Lens' ScanRun (Maybe ScanRunExecutionState) Source #

Output only. The execution state of the ScanRun.

srErrorTrace :: Lens' ScanRun (Maybe ScanRunErrorTrace) Source #

Output only. If result_state is an ERROR, this field provides the primary reason for scan's termination and more details, if such are available.