gogol-searchconsole-0.4.0: Google Search Console URL Testing Tools 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.SearchConsole

Contents

Description

Provides tools for running validation tests against single URLs

See: Google Search Console URL Testing Tools API Reference

Synopsis

Service Configuration

searchConsoleService :: ServiceConfig Source #

Default request referring to version v1 of the Google Search Console URL Testing Tools API. This contains the host and root path used as a starting point for constructing service requests.

API Declaration

type SearchConsoleAPI = URLTestingToolsMobileFriendlyTestRunResource Source #

Represents the entirety of the methods and resources available for the Google Search Console URL Testing Tools API service.

Resources

searchconsole.urlTestingTools.mobileFriendlyTest.run

Types

RunMobileFriendlyTestResponseMobileFriendliness

data RunMobileFriendlyTestResponseMobileFriendliness Source #

Test verdict, whether the page is mobile friendly or not.

Constructors

MobileFriendlyTestResultUnspecified

MOBILE_FRIENDLY_TEST_RESULT_UNSPECIFIED Internal error when running this test. Please try running the test again.

MobileFriendly

MOBILE_FRIENDLY The page is mobile friendly.

NotMobileFriendly

NOT_MOBILE_FRIENDLY The page is not mobile friendly.

Instances
Enum RunMobileFriendlyTestResponseMobileFriendliness Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Eq RunMobileFriendlyTestResponseMobileFriendliness Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Data RunMobileFriendlyTestResponseMobileFriendliness Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Methods

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

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

toConstr :: RunMobileFriendlyTestResponseMobileFriendliness -> Constr #

dataTypeOf :: RunMobileFriendlyTestResponseMobileFriendliness -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord RunMobileFriendlyTestResponseMobileFriendliness Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Read RunMobileFriendlyTestResponseMobileFriendliness Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Show RunMobileFriendlyTestResponseMobileFriendliness Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Generic RunMobileFriendlyTestResponseMobileFriendliness Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Hashable RunMobileFriendlyTestResponseMobileFriendliness Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

ToJSON RunMobileFriendlyTestResponseMobileFriendliness Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

FromJSON RunMobileFriendlyTestResponseMobileFriendliness Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

FromHttpApiData RunMobileFriendlyTestResponseMobileFriendliness Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

ToHttpApiData RunMobileFriendlyTestResponseMobileFriendliness Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

type Rep RunMobileFriendlyTestResponseMobileFriendliness Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

type Rep RunMobileFriendlyTestResponseMobileFriendliness = D1 (MetaData "RunMobileFriendlyTestResponseMobileFriendliness" "Network.Google.SearchConsole.Types.Sum" "gogol-searchconsole-0.4.0-33UccPcwZbN43RIExLRMSU" False) (C1 (MetaCons "MobileFriendlyTestResultUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "MobileFriendly" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NotMobileFriendly" PrefixI False) (U1 :: Type -> Type)))

Image

data Image Source #

Describe image data.

See: image smart constructor.

Instances
Eq Image Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Methods

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

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

Data Image Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Methods

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

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

toConstr :: Image -> Constr #

dataTypeOf :: Image -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Image Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Methods

showsPrec :: Int -> Image -> ShowS #

show :: Image -> String #

showList :: [Image] -> ShowS #

Generic Image Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Associated Types

type Rep Image :: Type -> Type #

Methods

from :: Image -> Rep Image x #

to :: Rep Image x -> Image #

ToJSON Image Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

FromJSON Image Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

type Rep Image Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

type Rep Image = D1 (MetaData "Image" "Network.Google.SearchConsole.Types.Product" "gogol-searchconsole-0.4.0-33UccPcwZbN43RIExLRMSU" False) (C1 (MetaCons "Image'" PrefixI True) (S1 (MetaSel (Just "_iData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: S1 (MetaSel (Just "_iMimeType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

image :: Image Source #

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

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

iData :: Lens' Image (Maybe ByteString) Source #

Image data in format determined by the mime type. Currently, the format will always be "image/png", but this might change in the future.

iMimeType :: Lens' Image (Maybe Text) Source #

The mime-type of the image data.

BlockedResource

data BlockedResource Source #

Blocked resource.

See: blockedResource smart constructor.

Instances
Eq BlockedResource Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Data BlockedResource Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Methods

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

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

toConstr :: BlockedResource -> Constr #

dataTypeOf :: BlockedResource -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BlockedResource Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Generic BlockedResource Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Associated Types

type Rep BlockedResource :: Type -> Type #

ToJSON BlockedResource Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

FromJSON BlockedResource Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

type Rep BlockedResource Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

type Rep BlockedResource = D1 (MetaData "BlockedResource" "Network.Google.SearchConsole.Types.Product" "gogol-searchconsole-0.4.0-33UccPcwZbN43RIExLRMSU" True) (C1 (MetaCons "BlockedResource'" PrefixI True) (S1 (MetaSel (Just "_brURL") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

blockedResource :: BlockedResource Source #

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

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

brURL :: Lens' BlockedResource (Maybe Text) Source #

URL of the blocked resource.

ResourceIssue

data ResourceIssue Source #

Information about a resource with issue.

See: resourceIssue smart constructor.

Instances
Eq ResourceIssue Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Data ResourceIssue Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Methods

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

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

toConstr :: ResourceIssue -> Constr #

dataTypeOf :: ResourceIssue -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ResourceIssue Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Generic ResourceIssue Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Associated Types

type Rep ResourceIssue :: Type -> Type #

ToJSON ResourceIssue Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

FromJSON ResourceIssue Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

type Rep ResourceIssue Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

type Rep ResourceIssue = D1 (MetaData "ResourceIssue" "Network.Google.SearchConsole.Types.Product" "gogol-searchconsole-0.4.0-33UccPcwZbN43RIExLRMSU" True) (C1 (MetaCons "ResourceIssue'" PrefixI True) (S1 (MetaSel (Just "_riBlockedResource") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe BlockedResource))))

resourceIssue :: ResourceIssue Source #

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

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

riBlockedResource :: Lens' ResourceIssue (Maybe BlockedResource) Source #

Describes a blocked resource issue.

TestStatusStatus

data TestStatusStatus Source #

Status of the test.

Constructors

TestStatusUnspecified

TEST_STATUS_UNSPECIFIED Internal error when running this test. Please try running the test again.

Complete

COMPLETE Inspection has completed without errors.

InternalError

INTERNAL_ERROR Inspection terminated in an error state. This indicates a problem in Google's infrastructure, not a user error. Please try again later.

PageUnreachable

PAGE_UNREACHABLE Google can not access the URL because of a user error such as a robots.txt blockage, a 403 or 500 code etc. Please make sure that the URL provided is accessible by Googlebot and is not password protected.

Instances
Enum TestStatusStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Eq TestStatusStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Data TestStatusStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Methods

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

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

toConstr :: TestStatusStatus -> Constr #

dataTypeOf :: TestStatusStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord TestStatusStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Read TestStatusStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Show TestStatusStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Generic TestStatusStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Associated Types

type Rep TestStatusStatus :: Type -> Type #

Hashable TestStatusStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

ToJSON TestStatusStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

FromJSON TestStatusStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

FromHttpApiData TestStatusStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

ToHttpApiData TestStatusStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

type Rep TestStatusStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

type Rep TestStatusStatus = D1 (MetaData "TestStatusStatus" "Network.Google.SearchConsole.Types.Sum" "gogol-searchconsole-0.4.0-33UccPcwZbN43RIExLRMSU" False) ((C1 (MetaCons "TestStatusUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Complete" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "InternalError" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PageUnreachable" PrefixI False) (U1 :: Type -> Type)))

RunMobileFriendlyTestRequest

data RunMobileFriendlyTestRequest Source #

Mobile-friendly test request.

See: runMobileFriendlyTestRequest smart constructor.

Instances
Eq RunMobileFriendlyTestRequest Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Data RunMobileFriendlyTestRequest Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Methods

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

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

toConstr :: RunMobileFriendlyTestRequest -> Constr #

dataTypeOf :: RunMobileFriendlyTestRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RunMobileFriendlyTestRequest Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Generic RunMobileFriendlyTestRequest Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Associated Types

type Rep RunMobileFriendlyTestRequest :: Type -> Type #

ToJSON RunMobileFriendlyTestRequest Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

FromJSON RunMobileFriendlyTestRequest Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

type Rep RunMobileFriendlyTestRequest Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

type Rep RunMobileFriendlyTestRequest = D1 (MetaData "RunMobileFriendlyTestRequest" "Network.Google.SearchConsole.Types.Product" "gogol-searchconsole-0.4.0-33UccPcwZbN43RIExLRMSU" False) (C1 (MetaCons "RunMobileFriendlyTestRequest'" PrefixI True) (S1 (MetaSel (Just "_rmftrURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_rmftrRequestScreenshot") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))

runMobileFriendlyTestRequest :: RunMobileFriendlyTestRequest Source #

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

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

rmftrRequestScreenshot :: Lens' RunMobileFriendlyTestRequest (Maybe Bool) Source #

Whether or not screenshot is requested. Default is false.

TestStatus

data TestStatus Source #

Final state of the test, including error details if necessary.

See: testStatus smart constructor.

Instances
Eq TestStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Data TestStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Methods

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

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

toConstr :: TestStatus -> Constr #

dataTypeOf :: TestStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TestStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Generic TestStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Associated Types

type Rep TestStatus :: Type -> Type #

ToJSON TestStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

FromJSON TestStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

type Rep TestStatus Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

type Rep TestStatus = D1 (MetaData "TestStatus" "Network.Google.SearchConsole.Types.Product" "gogol-searchconsole-0.4.0-33UccPcwZbN43RIExLRMSU" False) (C1 (MetaCons "TestStatus'" PrefixI True) (S1 (MetaSel (Just "_tsStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TestStatusStatus)) :*: S1 (MetaSel (Just "_tsDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

testStatus :: TestStatus Source #

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

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

tsDetails :: Lens' TestStatus (Maybe Text) Source #

Error details if applicable.

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.SearchConsole.Types.Sum

Eq Xgafv Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Methods

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

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

Data Xgafv Source # 
Instance details

Defined in Network.Google.SearchConsole.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.SearchConsole.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.SearchConsole.Types.Sum

Show Xgafv Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

Defined in Network.Google.SearchConsole.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.SearchConsole.Types.Sum

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.SearchConsole.Types.Sum" "gogol-searchconsole-0.4.0-33UccPcwZbN43RIExLRMSU" False) (C1 (MetaCons "X1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "X2" PrefixI False) (U1 :: Type -> Type))

MobileFriendlyIssueRule

data MobileFriendlyIssueRule Source #

Rule violated.

Constructors

MobileFriendlyRuleUnspecified

MOBILE_FRIENDLY_RULE_UNSPECIFIED Unknown rule. Sorry, we don't have any description for the rule that was broken.

UsesIncompatiblePlugins

USES_INCOMPATIBLE_PLUGINS Plugins incompatible with mobile devices are being used. Learn more.

ConfigureViewport

CONFIGURE_VIEWPORT Viewsport is not specified using the meta viewport tag. Learn more.

FixedWidthViewport

FIXED_WIDTH_VIEWPORT Viewport defined to a fixed width. Learn more.

SizeContentToViewport

SIZE_CONTENT_TO_VIEWPORT Content not sized to viewport. Learn more.

UseLegibleFontSizes

USE_LEGIBLE_FONT_SIZES Font size is too small for easy reading on a small screen. Learn More.

TapTargetsTooClose

TAP_TARGETS_TOO_CLOSE Touch elements are too close to each other. Learn more.

Instances
Enum MobileFriendlyIssueRule Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Eq MobileFriendlyIssueRule Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Data MobileFriendlyIssueRule Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Methods

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

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

toConstr :: MobileFriendlyIssueRule -> Constr #

dataTypeOf :: MobileFriendlyIssueRule -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord MobileFriendlyIssueRule Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Read MobileFriendlyIssueRule Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Show MobileFriendlyIssueRule Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Generic MobileFriendlyIssueRule Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

Associated Types

type Rep MobileFriendlyIssueRule :: Type -> Type #

Hashable MobileFriendlyIssueRule Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

ToJSON MobileFriendlyIssueRule Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

FromJSON MobileFriendlyIssueRule Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

FromHttpApiData MobileFriendlyIssueRule Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

ToHttpApiData MobileFriendlyIssueRule Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

type Rep MobileFriendlyIssueRule Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Sum

type Rep MobileFriendlyIssueRule = D1 (MetaData "MobileFriendlyIssueRule" "Network.Google.SearchConsole.Types.Sum" "gogol-searchconsole-0.4.0-33UccPcwZbN43RIExLRMSU" False) ((C1 (MetaCons "MobileFriendlyRuleUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "UsesIncompatiblePlugins" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ConfigureViewport" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "FixedWidthViewport" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SizeContentToViewport" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "UseLegibleFontSizes" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TapTargetsTooClose" PrefixI False) (U1 :: Type -> Type))))

RunMobileFriendlyTestResponse

data RunMobileFriendlyTestResponse Source #

Mobile-friendly test response, including mobile-friendly issues and resource issues.

See: runMobileFriendlyTestResponse smart constructor.

Instances
Eq RunMobileFriendlyTestResponse Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Data RunMobileFriendlyTestResponse Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Methods

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

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

toConstr :: RunMobileFriendlyTestResponse -> Constr #

dataTypeOf :: RunMobileFriendlyTestResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show RunMobileFriendlyTestResponse Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Generic RunMobileFriendlyTestResponse Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Associated Types

type Rep RunMobileFriendlyTestResponse :: Type -> Type #

ToJSON RunMobileFriendlyTestResponse Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

FromJSON RunMobileFriendlyTestResponse Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

type Rep RunMobileFriendlyTestResponse Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

type Rep RunMobileFriendlyTestResponse = D1 (MetaData "RunMobileFriendlyTestResponse" "Network.Google.SearchConsole.Types.Product" "gogol-searchconsole-0.4.0-33UccPcwZbN43RIExLRMSU" False) (C1 (MetaCons "RunMobileFriendlyTestResponse'" PrefixI True) ((S1 (MetaSel (Just "_rmftrScreenshot") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Image)) :*: S1 (MetaSel (Just "_rmftrResourceIssues") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ResourceIssue]))) :*: (S1 (MetaSel (Just "_rmftrMobileFriendliness") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe RunMobileFriendlyTestResponseMobileFriendliness)) :*: (S1 (MetaSel (Just "_rmftrTestStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TestStatus)) :*: S1 (MetaSel (Just "_rmftrMobileFriendlyIssues") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [MobileFriendlyIssue]))))))

runMobileFriendlyTestResponse :: RunMobileFriendlyTestResponse Source #

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

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

rmftrResourceIssues :: Lens' RunMobileFriendlyTestResponse [ResourceIssue] Source #

Information about embedded resources issues.

rmftrTestStatus :: Lens' RunMobileFriendlyTestResponse (Maybe TestStatus) Source #

Final state of the test, can be either complete or an error.

MobileFriendlyIssue

data MobileFriendlyIssue Source #

Mobile-friendly issue.

See: mobileFriendlyIssue smart constructor.

Instances
Eq MobileFriendlyIssue Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Data MobileFriendlyIssue Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Methods

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

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

toConstr :: MobileFriendlyIssue -> Constr #

dataTypeOf :: MobileFriendlyIssue -> DataType #

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

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

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

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

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

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

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

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

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

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

Show MobileFriendlyIssue Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Generic MobileFriendlyIssue Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

Associated Types

type Rep MobileFriendlyIssue :: Type -> Type #

ToJSON MobileFriendlyIssue Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

FromJSON MobileFriendlyIssue Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

type Rep MobileFriendlyIssue Source # 
Instance details

Defined in Network.Google.SearchConsole.Types.Product

type Rep MobileFriendlyIssue = D1 (MetaData "MobileFriendlyIssue" "Network.Google.SearchConsole.Types.Product" "gogol-searchconsole-0.4.0-33UccPcwZbN43RIExLRMSU" True) (C1 (MetaCons "MobileFriendlyIssue'" PrefixI True) (S1 (MetaSel (Just "_mfiRule") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe MobileFriendlyIssueRule))))

mobileFriendlyIssue :: MobileFriendlyIssue Source #

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

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