gogol-digitalassetlinks-0.5.0: Google Digital Asset Links 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.DigitalAssetLinks

Contents

Description

Discovers relationships between online assets such as websites or mobile apps.

See: Digital Asset Links API Reference

Synopsis

Service Configuration

digitalAssetLinksService :: ServiceConfig Source #

Default request referring to version v1 of the Digital Asset Links API. This contains the host and root path used as a starting point for constructing service requests.

API Declaration

type DigitalAssetLinksAPI = AssetlinksCheckResource :<|> StatementsListResource Source #

Represents the entirety of the methods and resources available for the Digital Asset Links API service.

Resources

digitalassetlinks.assetlinks.check

digitalassetlinks.statements.list

Types

AndroidAppAsset

data AndroidAppAsset Source #

Describes an android app asset.

See: androidAppAsset smart constructor.

Instances
Eq AndroidAppAsset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Data AndroidAppAsset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Methods

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

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

toConstr :: AndroidAppAsset -> Constr #

dataTypeOf :: AndroidAppAsset -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AndroidAppAsset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Generic AndroidAppAsset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Associated Types

type Rep AndroidAppAsset :: Type -> Type #

ToJSON AndroidAppAsset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

FromJSON AndroidAppAsset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

type Rep AndroidAppAsset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

type Rep AndroidAppAsset = D1 (MetaData "AndroidAppAsset" "Network.Google.DigitalAssetLinks.Types.Product" "gogol-digitalassetlinks-0.5.0-43hyYRatwvJAisCv50JmjN" False) (C1 (MetaCons "AndroidAppAsset'" PrefixI True) (S1 (MetaSel (Just "_aaaPackageName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_aaaCertificate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CertificateInfo))))

androidAppAsset :: AndroidAppAsset Source #

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

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

aaaPackageName :: Lens' AndroidAppAsset (Maybe Text) Source #

Android App assets are naturally identified by their Java package name. For example, the Google Maps app uses the package name `com.google.android.apps.maps`. REQUIRED

aaaCertificate :: Lens' AndroidAppAsset (Maybe CertificateInfo) Source #

Because there is no global enforcement of package name uniqueness, we also require a signing certificate, which in combination with the package name uniquely identifies an app. Some apps' signing keys are rotated, so they may be signed by different keys over time. We treat these as distinct assets, since we use (package name, cert) as the unique ID. This should not normally pose any problems as both versions of the app will make the same or similar statements. Other assets making statements about the app will have to be updated when a key is rotated, however. (Note that the syntaxes for publishing and querying for statements contain syntactic sugar to easily let you specify apps that are known by multiple certificates.) REQUIRED

Statement

data Statement Source #

Describes a reliable statement that has been made about the relationship between a source asset and a target asset. Statements are always made by the source asset, either directly or by delegating to a statement list that is stored elsewhere. For more detailed definitions of statements and assets, please refer to our API documentation landing page.

See: statement smart constructor.

Instances
Eq Statement Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Data Statement Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Methods

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

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

toConstr :: Statement -> Constr #

dataTypeOf :: Statement -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Statement Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Generic Statement Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Associated Types

type Rep Statement :: Type -> Type #

ToJSON Statement Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

FromJSON Statement Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

type Rep Statement Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

type Rep Statement = D1 (MetaData "Statement" "Network.Google.DigitalAssetLinks.Types.Product" "gogol-digitalassetlinks-0.5.0-43hyYRatwvJAisCv50JmjN" False) (C1 (MetaCons "Statement'" PrefixI True) (S1 (MetaSel (Just "_sRelation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_sSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Asset)) :*: S1 (MetaSel (Just "_sTarget") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Asset)))))

statement :: Statement Source #

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

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

sRelation :: Lens' Statement (Maybe Text) Source #

The relation identifies the use of the statement as intended by the source asset's owner (that is, the person or entity who issued the statement). Every complete statement has a relation. We identify relations with strings of the format `/`, where `` must be one of a set of pre-defined purpose categories, and `` is a free-form lowercase alphanumeric string that describes the specific use case of the statement. Refer to our API documentation for the current list of supported relations. Example: `delegate_permission/common.handle_all_urls` REQUIRED

sSource :: Lens' Statement (Maybe Asset) Source #

Every statement has a source asset. REQUIRED

sTarget :: Lens' Statement (Maybe Asset) Source #

Every statement has a target asset. REQUIRED

Asset

data Asset Source #

Uniquely identifies an asset. A digital asset is an identifiable and addressable online entity that typically provides some service or content. Examples of assets are websites, Android apps, Twitter feeds, and Plus Pages.

See: asset smart constructor.

Instances
Eq Asset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Methods

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

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

Data Asset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Methods

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

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

toConstr :: Asset -> Constr #

dataTypeOf :: Asset -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Asset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Methods

showsPrec :: Int -> Asset -> ShowS #

show :: Asset -> String #

showList :: [Asset] -> ShowS #

Generic Asset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Associated Types

type Rep Asset :: Type -> Type #

Methods

from :: Asset -> Rep Asset x #

to :: Rep Asset x -> Asset #

ToJSON Asset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

FromJSON Asset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

type Rep Asset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

type Rep Asset = D1 (MetaData "Asset" "Network.Google.DigitalAssetLinks.Types.Product" "gogol-digitalassetlinks-0.5.0-43hyYRatwvJAisCv50JmjN" False) (C1 (MetaCons "Asset'" PrefixI True) (S1 (MetaSel (Just "_aAndroidApp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AndroidAppAsset)) :*: S1 (MetaSel (Just "_aWeb") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe WebAsset))))

asset :: Asset Source #

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

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

aAndroidApp :: Lens' Asset (Maybe AndroidAppAsset) Source #

Set if this is an Android App asset.

aWeb :: Lens' Asset (Maybe WebAsset) Source #

Set if this is a web asset.

ListResponse

data ListResponse Source #

Response message for the List call.

See: listResponse smart constructor.

Instances
Eq ListResponse Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Data ListResponse Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Methods

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

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

toConstr :: ListResponse -> Constr #

dataTypeOf :: ListResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListResponse Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Generic ListResponse Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Associated Types

type Rep ListResponse :: Type -> Type #

ToJSON ListResponse Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

FromJSON ListResponse Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

type Rep ListResponse Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

type Rep ListResponse = D1 (MetaData "ListResponse" "Network.Google.DigitalAssetLinks.Types.Product" "gogol-digitalassetlinks-0.5.0-43hyYRatwvJAisCv50JmjN" False) (C1 (MetaCons "ListResponse'" PrefixI True) ((S1 (MetaSel (Just "_lrDebugString") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lrMaxAge") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration))) :*: (S1 (MetaSel (Just "_lrErrorCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_lrStatements") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Statement])))))

listResponse :: ListResponse Source #

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

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

lrDebugString :: Lens' ListResponse (Maybe Text) Source #

Human-readable message containing information intended to help end users understand, reproduce and debug the result. The message will be in English and we are currently not planning to offer any translations. Please note that no guarantees are made about the contents or format of this string. Any aspect of it may be subject to change without notice. You should not attempt to programmatically parse this data. For programmatic access, use the error_code field below.

lrMaxAge :: Lens' ListResponse (Maybe Scientific) Source #

From serving time, how much longer the response should be considered valid barring further updates. REQUIRED

lrErrorCode :: Lens' ListResponse [Text] Source #

Error codes that describe the result of the List operation.

lrStatements :: Lens' ListResponse [Statement] Source #

A list of all the matching statements that have been found.

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

Eq Xgafv Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Sum

Methods

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

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

Data Xgafv Source # 
Instance details

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

Show Xgafv Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

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

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Sum

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

CheckResponse

data CheckResponse Source #

Response message for the CheckAssetLinks call.

See: checkResponse smart constructor.

Instances
Eq CheckResponse Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Data CheckResponse Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Methods

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

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

toConstr :: CheckResponse -> Constr #

dataTypeOf :: CheckResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CheckResponse Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Generic CheckResponse Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Associated Types

type Rep CheckResponse :: Type -> Type #

ToJSON CheckResponse Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

FromJSON CheckResponse Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

type Rep CheckResponse Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

type Rep CheckResponse = D1 (MetaData "CheckResponse" "Network.Google.DigitalAssetLinks.Types.Product" "gogol-digitalassetlinks-0.5.0-43hyYRatwvJAisCv50JmjN" False) (C1 (MetaCons "CheckResponse'" PrefixI True) ((S1 (MetaSel (Just "_crDebugString") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_crMaxAge") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDuration))) :*: (S1 (MetaSel (Just "_crErrorCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_crLinked") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))

checkResponse :: CheckResponse Source #

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

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

crDebugString :: Lens' CheckResponse (Maybe Text) Source #

Human-readable message containing information intended to help end users understand, reproduce and debug the result. The message will be in English and we are currently not planning to offer any translations. Please note that no guarantees are made about the contents or format of this string. Any aspect of it may be subject to change without notice. You should not attempt to programmatically parse this data. For programmatic access, use the error_code field below.

crMaxAge :: Lens' CheckResponse (Maybe Scientific) Source #

From serving time, how much longer the response should be considered valid barring further updates. REQUIRED

crErrorCode :: Lens' CheckResponse [Text] Source #

Error codes that describe the result of the Check operation.

crLinked :: Lens' CheckResponse (Maybe Bool) Source #

Set to true if the assets specified in the request are linked by the relation specified in the request.

WebAsset

data WebAsset Source #

Describes a web asset.

See: webAsset smart constructor.

Instances
Eq WebAsset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Data WebAsset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Methods

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

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

toConstr :: WebAsset -> Constr #

dataTypeOf :: WebAsset -> DataType #

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

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

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

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

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

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

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

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

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

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

Show WebAsset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Generic WebAsset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Associated Types

type Rep WebAsset :: Type -> Type #

Methods

from :: WebAsset -> Rep WebAsset x #

to :: Rep WebAsset x -> WebAsset #

ToJSON WebAsset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

FromJSON WebAsset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

type Rep WebAsset Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

type Rep WebAsset = D1 (MetaData "WebAsset" "Network.Google.DigitalAssetLinks.Types.Product" "gogol-digitalassetlinks-0.5.0-43hyYRatwvJAisCv50JmjN" True) (C1 (MetaCons "WebAsset'" PrefixI True) (S1 (MetaSel (Just "_waSite") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

webAsset :: WebAsset Source #

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

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

waSite :: Lens' WebAsset (Maybe Text) Source #

Web assets are identified by a URL that contains only the scheme, hostname and port parts. The format is http[s]://[:] Hostnames must be fully qualified: they must end in a single period ("`.`"). Only the schemes "http" and "https" are currently allowed. Port numbers are given as a decimal number, and they must be omitted if the standard port numbers are used: 80 for http and 443 for https. We call this limited URL the "site". All URLs that share the same scheme, hostname and port are considered to be a part of the site and thus belong to the web asset. Example: the asset with the site `https://www.google.com` contains all these URLs: * `https://www.google.com/` * `https://www.google.com:443/` * `https://www.google.com/foo` * `https://www.google.com/foo?bar` * `https://www.google.com/foo#bar` * `https://user'password:www.google.com/` But it does not contain these URLs: * `http://www.google.com/` (wrong scheme) * `https://google.com/` (hostname does not match) * `https://www.google.com:444/` (port does not match) REQUIRED

CertificateInfo

data CertificateInfo Source #

Describes an X509 certificate.

See: certificateInfo smart constructor.

Instances
Eq CertificateInfo Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Data CertificateInfo Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Methods

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

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

toConstr :: CertificateInfo -> Constr #

dataTypeOf :: CertificateInfo -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CertificateInfo Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Generic CertificateInfo Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

Associated Types

type Rep CertificateInfo :: Type -> Type #

ToJSON CertificateInfo Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

FromJSON CertificateInfo Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

type Rep CertificateInfo Source # 
Instance details

Defined in Network.Google.DigitalAssetLinks.Types.Product

type Rep CertificateInfo = D1 (MetaData "CertificateInfo" "Network.Google.DigitalAssetLinks.Types.Product" "gogol-digitalassetlinks-0.5.0-43hyYRatwvJAisCv50JmjN" True) (C1 (MetaCons "CertificateInfo'" PrefixI True) (S1 (MetaSel (Just "_ciSha256Fingerprint") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

certificateInfo :: CertificateInfo Source #

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

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