gogol-acceleratedmobilepageurl-0.5.0: Google Accelerated Mobile Pages (AMP) URL 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.AcceleratedMobilePageURL

Contents

Description

Retrieves the list of AMP URLs (and equivalent AMP Cache URLs) for a given list of public URL(s).

See: Accelerated Mobile Pages (AMP) URL API Reference

Synopsis

Service Configuration

acceleratedMobilePageUrlService :: ServiceConfig Source #

Default request referring to version v1 of the Accelerated Mobile Pages (AMP) URL API. This contains the host and root path used as a starting point for constructing service requests.

API Declaration

type AcceleratedMobilePageUrlAPI = AmpURLsBatchGetResource Source #

Represents the entirety of the methods and resources available for the Accelerated Mobile Pages (AMP) URL API service.

Resources

acceleratedmobilepageurl.ampUrls.batchGet

Types

AmpURLError

data AmpURLError Source #

AMP URL Error resource for a requested URL that couldn't be found.

See: ampURLError smart constructor.

Instances
Eq AmpURLError Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

Data AmpURLError Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

Methods

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

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

toConstr :: AmpURLError -> Constr #

dataTypeOf :: AmpURLError -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AmpURLError Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

Generic AmpURLError Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

Associated Types

type Rep AmpURLError :: Type -> Type #

ToJSON AmpURLError Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

FromJSON AmpURLError Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

type Rep AmpURLError Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

type Rep AmpURLError = D1 (MetaData "AmpURLError" "Network.Google.AcceleratedMobilePageURL.Types.Product" "gogol-acceleratedmobilepageurl-0.5.0-Ad99QKD7w2XHrfjPm57lVx" False) (C1 (MetaCons "AmpURLError'" PrefixI True) (S1 (MetaSel (Just "_aueOriginalURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_aueErrorCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AmpURLErrorErrorCode)) :*: S1 (MetaSel (Just "_aueErrorMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

ampURLError :: AmpURLError Source #

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

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

aueOriginalURL :: Lens' AmpURLError (Maybe Text) Source #

The original non-AMP URL.

aueErrorCode :: Lens' AmpURLError (Maybe AmpURLErrorErrorCode) Source #

The error code of an API call.

aueErrorMessage :: Lens' AmpURLError (Maybe Text) Source #

An optional descriptive error message.

AmpURLErrorErrorCode

data AmpURLErrorErrorCode Source #

The error code of an API call.

Constructors

ErrorCodeUnspecified

ERROR_CODE_UNSPECIFIED Not specified error.

InputURLNotFound

INPUT_URL_NOT_FOUND Indicates the requested URL is not found in the index, possibly because it's unable to be found, not able to be accessed by Googlebot, or some other error.

NoAmpURL

NO_AMP_URL Indicates no AMP URL has been found that corresponds to the requested URL.

ApplicationError

APPLICATION_ERROR Indicates some kind of application error occurred at the server. Client advised to retry.

URLIsValidAmp

URL_IS_VALID_AMP DEPRECATED: Indicates the requested URL is a valid AMP URL. This is a non-error state, should not be relied upon as a sign of success or failure. It will be removed in future versions of the API.

URLIsInvalidAmp

URL_IS_INVALID_AMP Indicates that an AMP URL has been found that corresponds to the request URL, but it is not valid AMP HTML.

Instances
Enum AmpURLErrorErrorCode Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

Eq AmpURLErrorErrorCode Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

Data AmpURLErrorErrorCode Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

Methods

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

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

toConstr :: AmpURLErrorErrorCode -> Constr #

dataTypeOf :: AmpURLErrorErrorCode -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord AmpURLErrorErrorCode Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

Read AmpURLErrorErrorCode Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

Show AmpURLErrorErrorCode Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

Generic AmpURLErrorErrorCode Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

Associated Types

type Rep AmpURLErrorErrorCode :: Type -> Type #

Hashable AmpURLErrorErrorCode Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

ToJSON AmpURLErrorErrorCode Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

FromJSON AmpURLErrorErrorCode Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

FromHttpApiData AmpURLErrorErrorCode Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

ToHttpApiData AmpURLErrorErrorCode Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

type Rep AmpURLErrorErrorCode Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

type Rep AmpURLErrorErrorCode = D1 (MetaData "AmpURLErrorErrorCode" "Network.Google.AcceleratedMobilePageURL.Types.Sum" "gogol-acceleratedmobilepageurl-0.5.0-Ad99QKD7w2XHrfjPm57lVx" False) ((C1 (MetaCons "ErrorCodeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "InputURLNotFound" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NoAmpURL" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "ApplicationError" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "URLIsValidAmp" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "URLIsInvalidAmp" PrefixI False) (U1 :: Type -> Type))))

BatchGetAmpURLsResponse

data BatchGetAmpURLsResponse Source #

Batch AMP URL response.

See: batchGetAmpURLsResponse smart constructor.

Instances
Eq BatchGetAmpURLsResponse Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

Data BatchGetAmpURLsResponse Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

Methods

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

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

toConstr :: BatchGetAmpURLsResponse -> Constr #

dataTypeOf :: BatchGetAmpURLsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BatchGetAmpURLsResponse Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

Generic BatchGetAmpURLsResponse Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

Associated Types

type Rep BatchGetAmpURLsResponse :: Type -> Type #

ToJSON BatchGetAmpURLsResponse Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

FromJSON BatchGetAmpURLsResponse Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

type Rep BatchGetAmpURLsResponse Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

type Rep BatchGetAmpURLsResponse = D1 (MetaData "BatchGetAmpURLsResponse" "Network.Google.AcceleratedMobilePageURL.Types.Product" "gogol-acceleratedmobilepageurl-0.5.0-Ad99QKD7w2XHrfjPm57lVx" False) (C1 (MetaCons "BatchGetAmpURLsResponse'" PrefixI True) (S1 (MetaSel (Just "_bgaurAmpURLs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AmpURL])) :*: S1 (MetaSel (Just "_bgaurURLErrors") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [AmpURLError]))))

batchGetAmpURLsResponse :: BatchGetAmpURLsResponse Source #

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

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

bgaurAmpURLs :: Lens' BatchGetAmpURLsResponse [AmpURL] Source #

For each URL in BatchAmpUrlsRequest, the URL response. The response might not be in the same order as URLs in the batch request. If BatchAmpUrlsRequest contains duplicate URLs, AmpUrl is generated only once.

bgaurURLErrors :: Lens' BatchGetAmpURLsResponse [AmpURLError] Source #

The errors for requested URLs that have no AMP URL.

BatchGetAmpURLsRequest

data BatchGetAmpURLsRequest Source #

AMP URL request for a batch of URLs.

See: batchGetAmpURLsRequest smart constructor.

Instances
Eq BatchGetAmpURLsRequest Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

Data BatchGetAmpURLsRequest Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

Methods

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

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

toConstr :: BatchGetAmpURLsRequest -> Constr #

dataTypeOf :: BatchGetAmpURLsRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BatchGetAmpURLsRequest Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

Generic BatchGetAmpURLsRequest Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

Associated Types

type Rep BatchGetAmpURLsRequest :: Type -> Type #

ToJSON BatchGetAmpURLsRequest Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

FromJSON BatchGetAmpURLsRequest Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

type Rep BatchGetAmpURLsRequest Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

type Rep BatchGetAmpURLsRequest = D1 (MetaData "BatchGetAmpURLsRequest" "Network.Google.AcceleratedMobilePageURL.Types.Product" "gogol-acceleratedmobilepageurl-0.5.0-Ad99QKD7w2XHrfjPm57lVx" False) (C1 (MetaCons "BatchGetAmpURLsRequest'" PrefixI True) (S1 (MetaSel (Just "_bgaurURLs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_bgaurLookupStrategy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BatchGetAmpURLsRequestLookupStrategy))))

batchGetAmpURLsRequest :: BatchGetAmpURLsRequest Source #

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

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

bgaurURLs :: Lens' BatchGetAmpURLsRequest [Text] Source #

List of URLs to look up for the paired AMP URLs. The URLs are case-sensitive. Up to 50 URLs per lookup (see Usage Limits).

AmpURL

data AmpURL Source #

AMP URL response for a requested URL.

See: ampURL smart constructor.

Instances
Eq AmpURL Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

Methods

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

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

Data AmpURL Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

Methods

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

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

toConstr :: AmpURL -> Constr #

dataTypeOf :: AmpURL -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AmpURL Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

Generic AmpURL Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

Associated Types

type Rep AmpURL :: Type -> Type #

Methods

from :: AmpURL -> Rep AmpURL x #

to :: Rep AmpURL x -> AmpURL #

ToJSON AmpURL Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

FromJSON AmpURL Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

type Rep AmpURL Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Product

type Rep AmpURL = D1 (MetaData "AmpURL" "Network.Google.AcceleratedMobilePageURL.Types.Product" "gogol-acceleratedmobilepageurl-0.5.0-Ad99QKD7w2XHrfjPm57lVx" False) (C1 (MetaCons "AmpURL'" PrefixI True) (S1 (MetaSel (Just "_auOriginalURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_auAmpURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_auCdnAmpURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

ampURL :: AmpURL Source #

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

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

auOriginalURL :: Lens' AmpURL (Maybe Text) Source #

The original non-AMP URL.

auAmpURL :: Lens' AmpURL (Maybe Text) Source #

The AMP URL pointing to the publisher's web server.

auCdnAmpURL :: Lens' AmpURL (Maybe Text) Source #

The AMP Cache URL pointing to the cached document in the Google AMP Cache.

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

Eq Xgafv Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

Methods

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

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

Data Xgafv Source # 
Instance details

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

Show Xgafv Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

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

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

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

BatchGetAmpURLsRequestLookupStrategy

data BatchGetAmpURLsRequestLookupStrategy Source #

The lookup_strategy being requested.

Constructors

FetchLiveDoc

FETCH_LIVE_DOC FETCH_LIVE_DOC strategy involves live document fetch of URLs not found in the index. Any request URL not found in the index is crawled in realtime to validate if there is a corresponding AMP URL. This strategy has higher coverage but with extra latency introduced by realtime crawling. This is the default strategy. Applications using this strategy should set higher HTTP timeouts of the API calls.

InIndexDoc

IN_INDEX_DOC IN_INDEX_DOC strategy skips fetching live documents of URL(s) not found in index. For applications which need low latency use of IN_INDEX_DOC strategy is recommended.

Instances
Enum BatchGetAmpURLsRequestLookupStrategy Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

Eq BatchGetAmpURLsRequestLookupStrategy Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

Data BatchGetAmpURLsRequestLookupStrategy Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

Methods

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

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

toConstr :: BatchGetAmpURLsRequestLookupStrategy -> Constr #

dataTypeOf :: BatchGetAmpURLsRequestLookupStrategy -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BatchGetAmpURLsRequestLookupStrategy Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

Read BatchGetAmpURLsRequestLookupStrategy Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

Show BatchGetAmpURLsRequestLookupStrategy Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

Generic BatchGetAmpURLsRequestLookupStrategy Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

Hashable BatchGetAmpURLsRequestLookupStrategy Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

ToJSON BatchGetAmpURLsRequestLookupStrategy Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

FromJSON BatchGetAmpURLsRequestLookupStrategy Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

FromHttpApiData BatchGetAmpURLsRequestLookupStrategy Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

ToHttpApiData BatchGetAmpURLsRequestLookupStrategy Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

type Rep BatchGetAmpURLsRequestLookupStrategy Source # 
Instance details

Defined in Network.Google.AcceleratedMobilePageURL.Types.Sum

type Rep BatchGetAmpURLsRequestLookupStrategy = D1 (MetaData "BatchGetAmpURLsRequestLookupStrategy" "Network.Google.AcceleratedMobilePageURL.Types.Sum" "gogol-acceleratedmobilepageurl-0.5.0-Ad99QKD7w2XHrfjPm57lVx" False) (C1 (MetaCons "FetchLiveDoc" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "InIndexDoc" PrefixI False) (U1 :: Type -> Type))