gogol-firebase-dynamiclinks-0.4.0: Google Firebase Dynamic 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.FirebaseDynamicLinks.Types

Contents

Description

 
Synopsis

Service Configuration

firebaseDynamicLinksService :: ServiceConfig Source #

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

OAuth Scopes

firebaseScope :: Proxy '["https://www.googleapis.com/auth/firebase"] Source #

View and administer all your Firebase data and settings

NavigationInfo

data NavigationInfo Source #

Information of navigation behavior.

See: navigationInfo smart constructor.

Instances
Eq NavigationInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Data NavigationInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: NavigationInfo -> Constr #

dataTypeOf :: NavigationInfo -> DataType #

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

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

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

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

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

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

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

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

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

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

Show NavigationInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic NavigationInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Associated Types

type Rep NavigationInfo :: Type -> Type #

ToJSON NavigationInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON NavigationInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep NavigationInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep NavigationInfo = D1 (MetaData "NavigationInfo" "Network.Google.FirebaseDynamicLinks.Types.Product" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" True) (C1 (MetaCons "NavigationInfo'" PrefixI True) (S1 (MetaSel (Just "_niEnableForcedRedirect") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Bool))))

navigationInfo :: NavigationInfo Source #

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

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

niEnableForcedRedirect :: Lens' NavigationInfo (Maybe Bool) Source #

If this option is on, FDL click will be forced to redirect rather than show an interstitial page.

DesktopInfo

data DesktopInfo Source #

Desktop related attributes to the Dynamic Link.

See: desktopInfo smart constructor.

Instances
Eq DesktopInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Data DesktopInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: DesktopInfo -> Constr #

dataTypeOf :: DesktopInfo -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DesktopInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic DesktopInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Associated Types

type Rep DesktopInfo :: Type -> Type #

ToJSON DesktopInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON DesktopInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep DesktopInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep DesktopInfo = D1 (MetaData "DesktopInfo" "Network.Google.FirebaseDynamicLinks.Types.Product" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" True) (C1 (MetaCons "DesktopInfo'" PrefixI True) (S1 (MetaSel (Just "_diDesktopFallbackLink") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

desktopInfo :: DesktopInfo Source #

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

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

DynamicLinkEventStatPlatform

data DynamicLinkEventStatPlatform Source #

Requested platform.

Constructors

DynamicLinkPlatformUnspecified

DYNAMIC_LINK_PLATFORM_UNSPECIFIED Unspecified platform.

Android

ANDROID Represents Android platform. All apps and browsers on Android are classfied in this category.

Ios

IOS Represents iOS platform. All apps and browsers on iOS are classfied in this category.

Desktop

DESKTOP Represents desktop.

Other

OTHER Platforms are not categorized as Android/iOS/Destop fall into here.

Instances
Enum DynamicLinkEventStatPlatform Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Eq DynamicLinkEventStatPlatform Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Data DynamicLinkEventStatPlatform Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Methods

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

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

toConstr :: DynamicLinkEventStatPlatform -> Constr #

dataTypeOf :: DynamicLinkEventStatPlatform -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DynamicLinkEventStatPlatform Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Read DynamicLinkEventStatPlatform Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Show DynamicLinkEventStatPlatform Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Generic DynamicLinkEventStatPlatform Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Associated Types

type Rep DynamicLinkEventStatPlatform :: Type -> Type #

Hashable DynamicLinkEventStatPlatform Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

ToJSON DynamicLinkEventStatPlatform Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

FromJSON DynamicLinkEventStatPlatform Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

FromHttpApiData DynamicLinkEventStatPlatform Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

ToHttpApiData DynamicLinkEventStatPlatform Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

type Rep DynamicLinkEventStatPlatform Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

type Rep DynamicLinkEventStatPlatform = D1 (MetaData "DynamicLinkEventStatPlatform" "Network.Google.FirebaseDynamicLinks.Types.Sum" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) ((C1 (MetaCons "DynamicLinkPlatformUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Android" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Ios" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Desktop" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Other" PrefixI False) (U1 :: Type -> Type))))

Suffix

data Suffix Source #

Short Dynamic Link suffix.

See: suffix smart constructor.

Instances
Eq Suffix Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

Data Suffix Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: Suffix -> Constr #

dataTypeOf :: Suffix -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Suffix Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic Suffix Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Associated Types

type Rep Suffix :: Type -> Type #

Methods

from :: Suffix -> Rep Suffix x #

to :: Rep Suffix x -> Suffix #

ToJSON Suffix Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON Suffix Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep Suffix Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep Suffix = D1 (MetaData "Suffix" "Network.Google.FirebaseDynamicLinks.Types.Product" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) (C1 (MetaCons "Suffix'" PrefixI True) (S1 (MetaSel (Just "_sCustomSuffix") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_sOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SuffixOption))))

suffix :: Suffix Source #

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

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

sCustomSuffix :: Lens' Suffix (Maybe Text) Source #

Only applies to Option.CUSTOM.

DynamicLinkWarning

data DynamicLinkWarning Source #

Dynamic Links warning messages.

See: dynamicLinkWarning smart constructor.

Instances
Eq DynamicLinkWarning Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Data DynamicLinkWarning Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: DynamicLinkWarning -> Constr #

dataTypeOf :: DynamicLinkWarning -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DynamicLinkWarning Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic DynamicLinkWarning Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Associated Types

type Rep DynamicLinkWarning :: Type -> Type #

ToJSON DynamicLinkWarning Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON DynamicLinkWarning Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep DynamicLinkWarning Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep DynamicLinkWarning = D1 (MetaData "DynamicLinkWarning" "Network.Google.FirebaseDynamicLinks.Types.Product" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) (C1 (MetaCons "DynamicLinkWarning'" PrefixI True) (S1 (MetaSel (Just "_dlwWarningCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DynamicLinkWarningWarningCode)) :*: (S1 (MetaSel (Just "_dlwWarningDocumentLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dlwWarningMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

dynamicLinkWarning :: DynamicLinkWarning Source #

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

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

dlwWarningDocumentLink :: Lens' DynamicLinkWarning (Maybe Text) Source #

The document describing the warning, and helps resolve.

dlwWarningMessage :: Lens' DynamicLinkWarning (Maybe Text) Source #

The warning message to help developers improve their requests.

ManagedShortLink

data ManagedShortLink Source #

Managed Short Link.

See: managedShortLink smart constructor.

managedShortLink :: ManagedShortLink Source #

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

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

mslCreationTime :: Lens' ManagedShortLink (Maybe UTCTime) Source #

Creation timestamp of the short link.

mslLink :: Lens' ManagedShortLink (Maybe Text) Source #

Short durable link url, for example, "https://sample.app.goo.gl/xyz123". Required.

mslLinkName :: Lens' ManagedShortLink (Maybe Text) Source #

Link name defined by the creator. Required.

mslFlaggedAttribute :: Lens' ManagedShortLink [Text] Source #

Attributes that have been flagged about this short url.

CreateShortDynamicLinkRequest

data CreateShortDynamicLinkRequest Source #

Request to create a short Dynamic Link.

See: createShortDynamicLinkRequest smart constructor.

Instances
Eq CreateShortDynamicLinkRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Data CreateShortDynamicLinkRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: CreateShortDynamicLinkRequest -> Constr #

dataTypeOf :: CreateShortDynamicLinkRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CreateShortDynamicLinkRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic CreateShortDynamicLinkRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Associated Types

type Rep CreateShortDynamicLinkRequest :: Type -> Type #

ToJSON CreateShortDynamicLinkRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON CreateShortDynamicLinkRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep CreateShortDynamicLinkRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep CreateShortDynamicLinkRequest = D1 (MetaData "CreateShortDynamicLinkRequest" "Network.Google.FirebaseDynamicLinks.Types.Product" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) (C1 (MetaCons "CreateShortDynamicLinkRequest'" PrefixI True) ((S1 (MetaSel (Just "_csdlrLongDynamicLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_csdlrSuffix") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Suffix))) :*: (S1 (MetaSel (Just "_csdlrDynamicLinkInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DynamicLinkInfo)) :*: S1 (MetaSel (Just "_csdlrSdkVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

createShortDynamicLinkRequest :: CreateShortDynamicLinkRequest Source #

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

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

csdlrLongDynamicLink :: Lens' CreateShortDynamicLinkRequest (Maybe Text) Source #

Full long Dynamic Link URL with desired query parameters specified. For example, "https://sample.app.goo.gl/?link=http://www.google.com&apn=com.sample", Learn more.

csdlrSuffix :: Lens' CreateShortDynamicLinkRequest (Maybe Suffix) Source #

Short Dynamic Link suffix. Optional.

csdlrDynamicLinkInfo :: Lens' CreateShortDynamicLinkRequest (Maybe DynamicLinkInfo) Source #

Information about the Dynamic Link to be shortened. Learn more.

csdlrSdkVersion :: Lens' CreateShortDynamicLinkRequest (Maybe Text) Source #

Google SDK version. Version takes the form "major.minor.$patch"

SocialMetaTagInfo

data SocialMetaTagInfo Source #

Parameters for social meta tag params. Used to set meta tag data for link previews on social sites.

See: socialMetaTagInfo smart constructor.

Instances
Eq SocialMetaTagInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Data SocialMetaTagInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: SocialMetaTagInfo -> Constr #

dataTypeOf :: SocialMetaTagInfo -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SocialMetaTagInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic SocialMetaTagInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Associated Types

type Rep SocialMetaTagInfo :: Type -> Type #

ToJSON SocialMetaTagInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON SocialMetaTagInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep SocialMetaTagInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep SocialMetaTagInfo = D1 (MetaData "SocialMetaTagInfo" "Network.Google.FirebaseDynamicLinks.Types.Product" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) (C1 (MetaCons "SocialMetaTagInfo'" PrefixI True) (S1 (MetaSel (Just "_smtiSocialImageLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_smtiSocialDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_smtiSocialTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

socialMetaTagInfo :: SocialMetaTagInfo Source #

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

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

smtiSocialImageLink :: Lens' SocialMetaTagInfo (Maybe Text) Source #

An image url string. Optional.

smtiSocialDescription :: Lens' SocialMetaTagInfo (Maybe Text) Source #

A short description of the link. Optional.

smtiSocialTitle :: Lens' SocialMetaTagInfo (Maybe Text) Source #

Title to be displayed. Optional.

CreateShortDynamicLinkResponse

data CreateShortDynamicLinkResponse Source #

Response to create a short Dynamic Link.

See: createShortDynamicLinkResponse smart constructor.

Instances
Eq CreateShortDynamicLinkResponse Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Data CreateShortDynamicLinkResponse Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: CreateShortDynamicLinkResponse -> Constr #

dataTypeOf :: CreateShortDynamicLinkResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CreateShortDynamicLinkResponse Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic CreateShortDynamicLinkResponse Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Associated Types

type Rep CreateShortDynamicLinkResponse :: Type -> Type #

ToJSON CreateShortDynamicLinkResponse Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON CreateShortDynamicLinkResponse Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep CreateShortDynamicLinkResponse Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep CreateShortDynamicLinkResponse = D1 (MetaData "CreateShortDynamicLinkResponse" "Network.Google.FirebaseDynamicLinks.Types.Product" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) (C1 (MetaCons "CreateShortDynamicLinkResponse'" PrefixI True) (S1 (MetaSel (Just "_csdlrPreviewLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_csdlrWarning") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DynamicLinkWarning])) :*: S1 (MetaSel (Just "_csdlrShortLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

createShortDynamicLinkResponse :: CreateShortDynamicLinkResponse Source #

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

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

csdlrPreviewLink :: Lens' CreateShortDynamicLinkResponse (Maybe Text) Source #

Preview link to show the link flow chart. (debug info.)

csdlrWarning :: Lens' CreateShortDynamicLinkResponse [DynamicLinkWarning] Source #

Information about potential warnings on link creation.

csdlrShortLink :: Lens' CreateShortDynamicLinkResponse (Maybe Text) Source #

Short Dynamic Link value. e.g. https://abcd.app.goo.gl/wxyz

DynamicLinkEventStat

data DynamicLinkEventStat Source #

Dynamic Link event stat.

See: dynamicLinkEventStat smart constructor.

Instances
Eq DynamicLinkEventStat Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Data DynamicLinkEventStat Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: DynamicLinkEventStat -> Constr #

dataTypeOf :: DynamicLinkEventStat -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DynamicLinkEventStat Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic DynamicLinkEventStat Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Associated Types

type Rep DynamicLinkEventStat :: Type -> Type #

ToJSON DynamicLinkEventStat Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON DynamicLinkEventStat Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep DynamicLinkEventStat Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep DynamicLinkEventStat = D1 (MetaData "DynamicLinkEventStat" "Network.Google.FirebaseDynamicLinks.Types.Product" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) (C1 (MetaCons "DynamicLinkEventStat'" PrefixI True) (S1 (MetaSel (Just "_dlesEvent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DynamicLinkEventStatEvent)) :*: (S1 (MetaSel (Just "_dlesPlatform") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DynamicLinkEventStatPlatform)) :*: S1 (MetaSel (Just "_dlesCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))))

dynamicLinkEventStat :: DynamicLinkEventStat Source #

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

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

dlesCount :: Lens' DynamicLinkEventStat (Maybe Int64) Source #

The number of times this event occurred.

IosInfo

data IosInfo Source #

iOS related attributes to the Dynamic Link..

See: iosInfo smart constructor.

Instances
Eq IosInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

Data IosInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: IosInfo -> Constr #

dataTypeOf :: IosInfo -> DataType #

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

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

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

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

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

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

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

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

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

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

Show IosInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic IosInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Associated Types

type Rep IosInfo :: Type -> Type #

Methods

from :: IosInfo -> Rep IosInfo x #

to :: Rep IosInfo x -> IosInfo #

ToJSON IosInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON IosInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep IosInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep IosInfo = D1 (MetaData "IosInfo" "Network.Google.FirebaseDynamicLinks.Types.Product" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) (C1 (MetaCons "IosInfo'" PrefixI True) ((S1 (MetaSel (Just "_iiIosBundleId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_iiIosIPadBundleId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_iiIosAppStoreId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_iiIosMinimumVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_iiIosIPadFallbackLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_iiIosCustomScheme") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_iiIosFallbackLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

iosInfo :: IosInfo Source #

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

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

iiIosBundleId :: Lens' IosInfo (Maybe Text) Source #

iOS bundle ID of the app.

iiIosIPadBundleId :: Lens' IosInfo (Maybe Text) Source #

iPad bundle ID of the app.

iiIosIPadFallbackLink :: Lens' IosInfo (Maybe Text) Source #

If specified, this overrides the ios_fallback_link value on iPads.

iiIosCustomScheme :: Lens' IosInfo (Maybe Text) Source #

Custom (destination) scheme to use for iOS. By default, we’ll use the bundle ID as the custom scheme. Developer can override this behavior using this param.

iiIosFallbackLink :: Lens' IosInfo (Maybe Text) Source #

Link to open on iOS if the app is not installed.

DynamicLinkInfo

data DynamicLinkInfo Source #

Information about a Dynamic Link.

See: dynamicLinkInfo smart constructor.

Instances
Eq DynamicLinkInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Data DynamicLinkInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: DynamicLinkInfo -> Constr #

dataTypeOf :: DynamicLinkInfo -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DynamicLinkInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic DynamicLinkInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Associated Types

type Rep DynamicLinkInfo :: Type -> Type #

ToJSON DynamicLinkInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON DynamicLinkInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep DynamicLinkInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep DynamicLinkInfo = D1 (MetaData "DynamicLinkInfo" "Network.Google.FirebaseDynamicLinks.Types.Product" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) (C1 (MetaCons "DynamicLinkInfo'" PrefixI True) (((S1 (MetaSel (Just "_dliNavigationInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe NavigationInfo)) :*: S1 (MetaSel (Just "_dliDesktopInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DesktopInfo))) :*: (S1 (MetaSel (Just "_dliSocialMetaTagInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SocialMetaTagInfo)) :*: S1 (MetaSel (Just "_dliDynamicLinkDomain") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_dliLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dliIosInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe IosInfo))) :*: (S1 (MetaSel (Just "_dliDomainURIPrefix") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_dliAndroidInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AndroidInfo)) :*: S1 (MetaSel (Just "_dliAnalyticsInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AnalyticsInfo)))))))

dynamicLinkInfo :: DynamicLinkInfo Source #

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

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

dliNavigationInfo :: Lens' DynamicLinkInfo (Maybe NavigationInfo) Source #

Information of navigation behavior of a Firebase Dynamic Links.

dliDesktopInfo :: Lens' DynamicLinkInfo (Maybe DesktopInfo) Source #

Desktop related information. See desktop related parameters in the documentation.

dliSocialMetaTagInfo :: Lens' DynamicLinkInfo (Maybe SocialMetaTagInfo) Source #

Parameters for social meta tag params. Used to set meta tag data for link previews on social sites.

dliDynamicLinkDomain :: Lens' DynamicLinkInfo (Maybe Text) Source #

Dynamic Links domain that the project owns, e.g. abcd.app.goo.gl Learn more on how to set up Dynamic Link domain associated with your Firebase project. Required if missing domain_uri_prefix.

dliLink :: Lens' DynamicLinkInfo (Maybe Text) Source #

The link your app will open, You can specify any URL your app can handle. This link must be a well-formatted URL, be properly URL-encoded, and use the HTTP or HTTPS scheme. See 'link' parameters in the documentation. Required.

dliIosInfo :: Lens' DynamicLinkInfo (Maybe IosInfo) Source #

iOS related information. See iOS related parameters in the documentation.

dliDomainURIPrefix :: Lens' DynamicLinkInfo (Maybe Text) Source #

E.g. https://maps.app.goo.gl, https://maps.page.link, https://g.co/maps More examples can be found in description of getNormalizedUriPrefix in j/c/g/firebase/dynamiclinks/uri/DdlDomain.java Will fallback to dynamic_link_domain is this field is missing

dliAndroidInfo :: Lens' DynamicLinkInfo (Maybe AndroidInfo) Source #

Android related information. See Android related parameters in the documentation.

dliAnalyticsInfo :: Lens' DynamicLinkInfo (Maybe AnalyticsInfo) Source #

Parameters used for tracking. See all tracking parameters in the documentation.

GetIosPostInstallAttributionRequestVisualStyle

data GetIosPostInstallAttributionRequestVisualStyle Source #

Strong match page information. Disambiguates between default UI and custom page to present when strong match succeeds/fails to find cookie.

Constructors

UnknownVisualStyle

UNKNOWN_VISUAL_STYLE Unknown style.

DefaultStyle

DEFAULT_STYLE Default style.

CustomStyle

CUSTOM_STYLE Custom style.

Instances
Enum GetIosPostInstallAttributionRequestVisualStyle Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Eq GetIosPostInstallAttributionRequestVisualStyle Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Data GetIosPostInstallAttributionRequestVisualStyle Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Methods

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

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

toConstr :: GetIosPostInstallAttributionRequestVisualStyle -> Constr #

dataTypeOf :: GetIosPostInstallAttributionRequestVisualStyle -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord GetIosPostInstallAttributionRequestVisualStyle Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Read GetIosPostInstallAttributionRequestVisualStyle Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Show GetIosPostInstallAttributionRequestVisualStyle Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Generic GetIosPostInstallAttributionRequestVisualStyle Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Hashable GetIosPostInstallAttributionRequestVisualStyle Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

ToJSON GetIosPostInstallAttributionRequestVisualStyle Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

FromJSON GetIosPostInstallAttributionRequestVisualStyle Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

FromHttpApiData GetIosPostInstallAttributionRequestVisualStyle Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

ToHttpApiData GetIosPostInstallAttributionRequestVisualStyle Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

type Rep GetIosPostInstallAttributionRequestVisualStyle Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

type Rep GetIosPostInstallAttributionRequestVisualStyle = D1 (MetaData "GetIosPostInstallAttributionRequestVisualStyle" "Network.Google.FirebaseDynamicLinks.Types.Sum" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) (C1 (MetaCons "UnknownVisualStyle" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "DefaultStyle" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CustomStyle" PrefixI False) (U1 :: Type -> Type)))

DynamicLinkStats

data DynamicLinkStats Source #

Analytics stats of a Dynamic Link for a given timeframe.

See: dynamicLinkStats smart constructor.

Instances
Eq DynamicLinkStats Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Data DynamicLinkStats Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: DynamicLinkStats -> Constr #

dataTypeOf :: DynamicLinkStats -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DynamicLinkStats Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic DynamicLinkStats Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Associated Types

type Rep DynamicLinkStats :: Type -> Type #

ToJSON DynamicLinkStats Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON DynamicLinkStats Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep DynamicLinkStats Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep DynamicLinkStats = D1 (MetaData "DynamicLinkStats" "Network.Google.FirebaseDynamicLinks.Types.Product" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" True) (C1 (MetaCons "DynamicLinkStats'" PrefixI True) (S1 (MetaSel (Just "_dlsLinkEventStats") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [DynamicLinkEventStat]))))

dynamicLinkStats :: DynamicLinkStats Source #

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

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

SuffixOption

data SuffixOption Source #

Suffix option.

Constructors

OptionUnspecified

OPTION_UNSPECIFIED The suffix option is not specified, performs as UNGUESSABLE .

Unguessable

UNGUESSABLE Short Dynamic Link suffix is a base62 [0-9A-Za-z] encoded string of a random generated 96 bit random number, which has a length of 17 chars. For example, "nlAR8U4SlKRZw1cb2". It prevents other people from guessing and crawling short Dynamic Links that contain personal identifiable information.

Short

SHORT Short Dynamic Link suffix is a base62 [0-9A-Za-z] string starting with a length of 4 chars. the length will increase when all the space is occupied.

Custom

CUSTOM Custom DDL suffix is a client specified string, for example, "buy2get1free". NOTE: custom suffix should only be available to managed short link creation

Instances
Enum SuffixOption Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Eq SuffixOption Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Data SuffixOption Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Methods

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

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

toConstr :: SuffixOption -> Constr #

dataTypeOf :: SuffixOption -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SuffixOption Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Read SuffixOption Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Show SuffixOption Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Generic SuffixOption Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Associated Types

type Rep SuffixOption :: Type -> Type #

Hashable SuffixOption Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

ToJSON SuffixOption Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

FromJSON SuffixOption Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

FromHttpApiData SuffixOption Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

ToHttpApiData SuffixOption Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

type Rep SuffixOption Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

type Rep SuffixOption = D1 (MetaData "SuffixOption" "Network.Google.FirebaseDynamicLinks.Types.Sum" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) ((C1 (MetaCons "OptionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Unguessable" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Short" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Custom" PrefixI False) (U1 :: Type -> Type)))

DynamicLinkEventStatEvent

data DynamicLinkEventStatEvent Source #

Link event.

Constructors

DynamicLinkEventUnspecified

DYNAMIC_LINK_EVENT_UNSPECIFIED Unspecified type.

Click

CLICK Indicates that an FDL is clicked by users.

Redirect

REDIRECT Indicates that an FDL redirects users to fallback link.

AppInstall

APP_INSTALL Indicates that an FDL triggers an app install from Play store, currently it's impossible to get stats from App store.

AppFirstOpen

APP_FIRST_OPEN Indicates that the app is opened for the first time after an install triggered by FDLs

AppReOpen

APP_RE_OPEN Indicates that the app is opened via an FDL for non-first time.

Instances
Enum DynamicLinkEventStatEvent Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Eq DynamicLinkEventStatEvent Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Data DynamicLinkEventStatEvent Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Methods

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

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

toConstr :: DynamicLinkEventStatEvent -> Constr #

dataTypeOf :: DynamicLinkEventStatEvent -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DynamicLinkEventStatEvent Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Read DynamicLinkEventStatEvent Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Show DynamicLinkEventStatEvent Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Generic DynamicLinkEventStatEvent Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Associated Types

type Rep DynamicLinkEventStatEvent :: Type -> Type #

Hashable DynamicLinkEventStatEvent Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

ToJSON DynamicLinkEventStatEvent Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

FromJSON DynamicLinkEventStatEvent Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

FromHttpApiData DynamicLinkEventStatEvent Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

ToHttpApiData DynamicLinkEventStatEvent Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

type Rep DynamicLinkEventStatEvent Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

type Rep DynamicLinkEventStatEvent = D1 (MetaData "DynamicLinkEventStatEvent" "Network.Google.FirebaseDynamicLinks.Types.Sum" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) ((C1 (MetaCons "DynamicLinkEventUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Click" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Redirect" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "AppInstall" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "AppFirstOpen" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "AppReOpen" PrefixI False) (U1 :: Type -> Type))))

CreateManagedShortLinkRequest

data CreateManagedShortLinkRequest Source #

Request to create a managed Short Dynamic Link.

See: createManagedShortLinkRequest smart constructor.

Instances
Eq CreateManagedShortLinkRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Data CreateManagedShortLinkRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: CreateManagedShortLinkRequest -> Constr #

dataTypeOf :: CreateManagedShortLinkRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CreateManagedShortLinkRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic CreateManagedShortLinkRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Associated Types

type Rep CreateManagedShortLinkRequest :: Type -> Type #

ToJSON CreateManagedShortLinkRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON CreateManagedShortLinkRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep CreateManagedShortLinkRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep CreateManagedShortLinkRequest = D1 (MetaData "CreateManagedShortLinkRequest" "Network.Google.FirebaseDynamicLinks.Types.Product" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) (C1 (MetaCons "CreateManagedShortLinkRequest'" PrefixI True) ((S1 (MetaSel (Just "_cmslrLongDynamicLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cmslrSuffix") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Suffix))) :*: (S1 (MetaSel (Just "_cmslrDynamicLinkInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DynamicLinkInfo)) :*: (S1 (MetaSel (Just "_cmslrSdkVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cmslrName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

createManagedShortLinkRequest :: CreateManagedShortLinkRequest Source #

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

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

cmslrLongDynamicLink :: Lens' CreateManagedShortLinkRequest (Maybe Text) Source #

Full long Dynamic Link URL with desired query parameters specified. For example, "https://sample.app.goo.gl/?link=http://www.google.com&apn=com.sample", Learn more.

cmslrSuffix :: Lens' CreateManagedShortLinkRequest (Maybe Suffix) Source #

Short Dynamic Link suffix. Optional.

cmslrDynamicLinkInfo :: Lens' CreateManagedShortLinkRequest (Maybe DynamicLinkInfo) Source #

Information about the Dynamic Link to be shortened. Learn more.

cmslrSdkVersion :: Lens' CreateManagedShortLinkRequest (Maybe Text) Source #

Google SDK version. Version takes the form "major.minor.$patch"

cmslrName :: Lens' CreateManagedShortLinkRequest (Maybe Text) Source #

Link name to associate with the link. It's used for marketer to identify manually-created links in the Firebase console (https://console.firebase.google.com/). Links must be named to be tracked.

GetIosReopenAttributionResponse

data GetIosReopenAttributionResponse Source #

Response for iSDK to get reopen attribution for app universal link open deeplinking. This endpoint is meant for only iOS requests.

See: getIosReopenAttributionResponse smart constructor.

Instances
Eq GetIosReopenAttributionResponse Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Data GetIosReopenAttributionResponse Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: GetIosReopenAttributionResponse -> Constr #

dataTypeOf :: GetIosReopenAttributionResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GetIosReopenAttributionResponse Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic GetIosReopenAttributionResponse Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Associated Types

type Rep GetIosReopenAttributionResponse :: Type -> Type #

ToJSON GetIosReopenAttributionResponse Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON GetIosReopenAttributionResponse Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep GetIosReopenAttributionResponse Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep GetIosReopenAttributionResponse = D1 (MetaData "GetIosReopenAttributionResponse" "Network.Google.FirebaseDynamicLinks.Types.Product" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) (C1 (MetaCons "GetIosReopenAttributionResponse'" PrefixI True) ((S1 (MetaSel (Just "_girarIosMinAppVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_girarDeepLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_girarResolvedLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_girarUtmMedium") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_girarInvitationId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_girarUtmCampaign") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_girarUtmSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

getIosReopenAttributionResponse :: GetIosReopenAttributionResponse Source #

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

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

girarIosMinAppVersion :: Lens' GetIosReopenAttributionResponse (Maybe Text) Source #

FDL input value of the "&imv=" parameter, minimum app version to be returned to Google Firebase SDK running on iOS-9.

girarDeepLink :: Lens' GetIosReopenAttributionResponse (Maybe Text) Source #

The deep-link attributed the app universal link open. For both regular FDL links and invite FDL links.

girarResolvedLink :: Lens' GetIosReopenAttributionResponse (Maybe Text) Source #

The entire FDL, expanded from a short link. It is the same as the requested_link, if it is long.

girarUtmMedium :: Lens' GetIosReopenAttributionResponse (Maybe Text) Source #

Scion medium value to be propagated by iSDK to Scion at app-reopen.

girarInvitationId :: Lens' GetIosReopenAttributionResponse (Maybe Text) Source #

Optional invitation ID, for only invite typed requested FDL links.

girarUtmCampaign :: Lens' GetIosReopenAttributionResponse (Maybe Text) Source #

Scion campaign value to be propagated by iSDK to Scion at app-reopen.

girarUtmSource :: Lens' GetIosReopenAttributionResponse (Maybe Text) Source #

Scion source value to be propagated by iSDK to Scion at app-reopen.

GetIosPostInstallAttributionResponseRequestIPVersion

data GetIosPostInstallAttributionResponseRequestIPVersion Source #

Which IP version the request was made from.

Constructors

UnknownIPVersion

UNKNOWN_IP_VERSION Unset.

IPV4

IP_V4 Request made from an IPv4 IP address.

IPV6

IP_V6 Request made from an IPv6 IP address.

Instances
Enum GetIosPostInstallAttributionResponseRequestIPVersion Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Eq GetIosPostInstallAttributionResponseRequestIPVersion Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Data GetIosPostInstallAttributionResponseRequestIPVersion Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Methods

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

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

toConstr :: GetIosPostInstallAttributionResponseRequestIPVersion -> Constr #

dataTypeOf :: GetIosPostInstallAttributionResponseRequestIPVersion -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord GetIosPostInstallAttributionResponseRequestIPVersion Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Read GetIosPostInstallAttributionResponseRequestIPVersion Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Show GetIosPostInstallAttributionResponseRequestIPVersion Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Generic GetIosPostInstallAttributionResponseRequestIPVersion Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Hashable GetIosPostInstallAttributionResponseRequestIPVersion Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

ToJSON GetIosPostInstallAttributionResponseRequestIPVersion Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

FromJSON GetIosPostInstallAttributionResponseRequestIPVersion Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

FromHttpApiData GetIosPostInstallAttributionResponseRequestIPVersion Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

ToHttpApiData GetIosPostInstallAttributionResponseRequestIPVersion Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

type Rep GetIosPostInstallAttributionResponseRequestIPVersion Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

type Rep GetIosPostInstallAttributionResponseRequestIPVersion = D1 (MetaData "GetIosPostInstallAttributionResponseRequestIPVersion" "Network.Google.FirebaseDynamicLinks.Types.Sum" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) (C1 (MetaCons "UnknownIPVersion" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "IPV4" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "IPV6" PrefixI False) (U1 :: Type -> Type)))

GetIosPostInstallAttributionRequest

data GetIosPostInstallAttributionRequest Source #

Request for iSDK to execute strong match flow for post-install attribution. This is meant for iOS requests only. Requests from other platforms will not be honored.

See: getIosPostInstallAttributionRequest smart constructor.

Instances
Eq GetIosPostInstallAttributionRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Data GetIosPostInstallAttributionRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: GetIosPostInstallAttributionRequest -> Constr #

dataTypeOf :: GetIosPostInstallAttributionRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GetIosPostInstallAttributionRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic GetIosPostInstallAttributionRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

ToJSON GetIosPostInstallAttributionRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON GetIosPostInstallAttributionRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep GetIosPostInstallAttributionRequest Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep GetIosPostInstallAttributionRequest = D1 (MetaData "GetIosPostInstallAttributionRequest" "Network.Google.FirebaseDynamicLinks.Types.Product" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) (C1 (MetaCons "GetIosPostInstallAttributionRequest'" PrefixI True) (((S1 (MetaSel (Just "_gipiarIosVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gipiarUniqueMatchLinkToCheck") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_gipiarAppInstallationTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_gipiarDevice") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeviceInfo)))) :*: ((S1 (MetaSel (Just "_gipiarSdkVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gipiarBundleId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_gipiarRetrievalMethod") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GetIosPostInstallAttributionRequestRetrievalMethod)) :*: S1 (MetaSel (Just "_gipiarVisualStyle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GetIosPostInstallAttributionRequestVisualStyle))))))

gipiarIosVersion :: Lens' GetIosPostInstallAttributionRequest (Maybe Text) Source #

iOS version, ie: 9.3.5. Consider adding "build".

gipiarUniqueMatchLinkToCheck :: Lens' GetIosPostInstallAttributionRequest (Maybe Text) Source #

Possible unique matched link that server need to check before performing fingerprint match. If passed link is short server need to expand the link. If link is long server need to vslidate the link.

gipiarAppInstallationTime :: Lens' GetIosPostInstallAttributionRequest (Maybe Int64) Source #

App installation epoch time (https://en.wikipedia.org/wiki/Unix_time). This is a client signal for a more accurate weak match.

gipiarSdkVersion :: Lens' GetIosPostInstallAttributionRequest (Maybe Text) Source #

Google SDK version. Version takes the form "major.minor.$patch"

gipiarRetrievalMethod :: Lens' GetIosPostInstallAttributionRequest (Maybe GetIosPostInstallAttributionRequestRetrievalMethod) Source #

App post install attribution retrieval information. Disambiguates mechanism (iSDK or developer invoked) to retrieve payload from clicked link.

gipiarVisualStyle :: Lens' GetIosPostInstallAttributionRequest (Maybe GetIosPostInstallAttributionRequestVisualStyle) Source #

Strong match page information. Disambiguates between default UI and custom page to present when strong match succeeds/fails to find cookie.

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

Eq Xgafv Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Methods

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

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

Data Xgafv Source # 
Instance details

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

Show Xgafv Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

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

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.FirebaseDynamicLinks.Types.Sum" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) (C1 (MetaCons "X1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "X2" PrefixI False) (U1 :: Type -> Type))

GetIosPostInstallAttributionResponseAttributionConfidence

data GetIosPostInstallAttributionResponseAttributionConfidence Source #

The confidence of the returned attribution.

Constructors

UnknownAttributionConfidence

UNKNOWN_ATTRIBUTION_CONFIDENCE Unset.

Weak

WEAK Weak confidence, more than one matching link found or link suspected to be false positive

Default

DEFAULT Default confidence, match based on fingerprint

Unique

UNIQUE Unique confidence, match based on "unique match link to check" or other means

Instances
Enum GetIosPostInstallAttributionResponseAttributionConfidence Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Eq GetIosPostInstallAttributionResponseAttributionConfidence Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Data GetIosPostInstallAttributionResponseAttributionConfidence Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Methods

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

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

toConstr :: GetIosPostInstallAttributionResponseAttributionConfidence -> Constr #

dataTypeOf :: GetIosPostInstallAttributionResponseAttributionConfidence -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord GetIosPostInstallAttributionResponseAttributionConfidence Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Read GetIosPostInstallAttributionResponseAttributionConfidence Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Show GetIosPostInstallAttributionResponseAttributionConfidence Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Generic GetIosPostInstallAttributionResponseAttributionConfidence Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Hashable GetIosPostInstallAttributionResponseAttributionConfidence Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

ToJSON GetIosPostInstallAttributionResponseAttributionConfidence Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

FromJSON GetIosPostInstallAttributionResponseAttributionConfidence Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

FromHttpApiData GetIosPostInstallAttributionResponseAttributionConfidence Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

ToHttpApiData GetIosPostInstallAttributionResponseAttributionConfidence Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

type Rep GetIosPostInstallAttributionResponseAttributionConfidence Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

type Rep GetIosPostInstallAttributionResponseAttributionConfidence = D1 (MetaData "GetIosPostInstallAttributionResponseAttributionConfidence" "Network.Google.FirebaseDynamicLinks.Types.Sum" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) ((C1 (MetaCons "UnknownAttributionConfidence" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Weak" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Default" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Unique" PrefixI False) (U1 :: Type -> Type)))

AndroidInfo

data AndroidInfo Source #

Android related attributes to the Dynamic Link.

See: androidInfo smart constructor.

Instances
Eq AndroidInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Data AndroidInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: AndroidInfo -> Constr #

dataTypeOf :: AndroidInfo -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AndroidInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic AndroidInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Associated Types

type Rep AndroidInfo :: Type -> Type #

ToJSON AndroidInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON AndroidInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep AndroidInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep AndroidInfo = D1 (MetaData "AndroidInfo" "Network.Google.FirebaseDynamicLinks.Types.Product" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) (C1 (MetaCons "AndroidInfo'" PrefixI True) ((S1 (MetaSel (Just "_aiAndroidMinPackageVersionCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_aiAndroidFallbackLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_aiAndroidLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_aiAndroidPackageName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

androidInfo :: AndroidInfo Source #

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

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

aiAndroidMinPackageVersionCode :: Lens' AndroidInfo (Maybe Text) Source #

Minimum version code for the Android app. If the installed app’s version code is lower, then the user is taken to the Play Store.

aiAndroidFallbackLink :: Lens' AndroidInfo (Maybe Text) Source #

Link to open on Android if the app is not installed.

aiAndroidLink :: Lens' AndroidInfo (Maybe Text) Source #

If specified, this overrides the ‘link’ parameter on Android.

aiAndroidPackageName :: Lens' AndroidInfo (Maybe Text) Source #

Android package name of the app.

DynamicLinkWarningWarningCode

data DynamicLinkWarningWarningCode Source #

The warning code.

Constructors

CodeUnspecified

CODE_UNSPECIFIED Unknown code.

NotInProjectAndroidPackageName

NOT_IN_PROJECT_ANDROID_PACKAGE_NAME The Android package does not match any in developer's DevConsole project.

NotIntegerAndroidPackageMinVersion

NOT_INTEGER_ANDROID_PACKAGE_MIN_VERSION The Android minimum version code has to be a valid integer.

UnnecessaryAndroidPackageMinVersion

UNNECESSARY_ANDROID_PACKAGE_MIN_VERSION Android package min version param is not needed, e.g. when 'apn' is missing.

NotURIAndroidLink

NOT_URI_ANDROID_LINK Android link is not a valid URI.

UnnecessaryAndroidLink

UNNECESSARY_ANDROID_LINK Android link param is not needed, e.g. when param 'al' and 'link' have the same value..

NotURIAndroidFallbackLink

NOT_URI_ANDROID_FALLBACK_LINK Android fallback link is not a valid URI.

BadURISchemeAndroidFallbackLink

BAD_URI_SCHEME_ANDROID_FALLBACK_LINK Android fallback link has an invalid (non http/https) URI scheme.

NotInProjectIosBundleId

NOT_IN_PROJECT_IOS_BUNDLE_ID The iOS bundle ID does not match any in developer's DevConsole project.

NotInProjectIPadBundleId

NOT_IN_PROJECT_IPAD_BUNDLE_ID The iPad bundle ID does not match any in developer's DevConsole project.

UnnecessaryIosURLScheme

UNNECESSARY_IOS_URL_SCHEME iOS URL scheme is not needed, e.g. when 'ibi' are 'ipbi' are all missing.

NotNumericIosAppStoreId

NOT_NUMERIC_IOS_APP_STORE_ID iOS app store ID format is incorrect, e.g. not numeric.

UnnecessaryIosAppStoreId

UNNECESSARY_IOS_APP_STORE_ID iOS app store ID is not needed.

NotURIIosFallbackLink

NOT_URI_IOS_FALLBACK_LINK iOS fallback link is not a valid URI.

BadURISchemeIosFallbackLink

BAD_URI_SCHEME_IOS_FALLBACK_LINK iOS fallback link has an invalid (non http/https) URI scheme.

NotURIIPadFallbackLink

NOT_URI_IPAD_FALLBACK_LINK iPad fallback link is not a valid URI.

BadURISchemeIPadFallbackLink

BAD_URI_SCHEME_IPAD_FALLBACK_LINK iPad fallback link has an invalid (non http/https) URI scheme.

BadDebugParam

BAD_DEBUG_PARAM Debug param format is incorrect.

BadAdParam

BAD_AD_PARAM isAd param format is incorrect.

DeprecatedParam

DEPRECATED_PARAM Indicates a certain param is deprecated.

UnrecognizedParam

UNRECOGNIZED_PARAM Indicates certain paramater is not recognized.

TooLongParam

TOO_LONG_PARAM Indicates certain paramater is too long.

NotURISocialImageLink

NOT_URI_SOCIAL_IMAGE_LINK Social meta tag image link is not a valid URI.

BadURISchemeSocialImageLink

BAD_URI_SCHEME_SOCIAL_IMAGE_LINK Social meta tag image link has an invalid (non http/https) URI scheme.

NotURISocialURL
NOT_URI_SOCIAL_URL
BadURISchemeSocialURL
BAD_URI_SCHEME_SOCIAL_URL
LinkLengthTooLong

LINK_LENGTH_TOO_LONG Dynamic Link URL length is too long.

LinkWithFragments

LINK_WITH_FRAGMENTS Dynamic Link URL contains fragments.

NotMatchingIosBundleIdAndStoreId

NOT_MATCHING_IOS_BUNDLE_ID_AND_STORE_ID The iOS bundle ID does not match with the given iOS store ID.

Instances
Enum DynamicLinkWarningWarningCode Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Eq DynamicLinkWarningWarningCode Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Data DynamicLinkWarningWarningCode Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Methods

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

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

toConstr :: DynamicLinkWarningWarningCode -> Constr #

dataTypeOf :: DynamicLinkWarningWarningCode -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DynamicLinkWarningWarningCode Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Read DynamicLinkWarningWarningCode Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Show DynamicLinkWarningWarningCode Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Generic DynamicLinkWarningWarningCode Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

Associated Types

type Rep DynamicLinkWarningWarningCode :: Type -> Type #

Hashable DynamicLinkWarningWarningCode Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

ToJSON DynamicLinkWarningWarningCode Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

FromJSON DynamicLinkWarningWarningCode Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

FromHttpApiData DynamicLinkWarningWarningCode Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

ToHttpApiData DynamicLinkWarningWarningCode Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

type Rep DynamicLinkWarningWarningCode Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Sum

type Rep DynamicLinkWarningWarningCode = D1 (MetaData "DynamicLinkWarningWarningCode" "Network.Google.FirebaseDynamicLinks.Types.Sum" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) ((((C1 (MetaCons "CodeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "NotInProjectAndroidPackageName" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NotIntegerAndroidPackageMinVersion" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "UnnecessaryAndroidPackageMinVersion" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NotURIAndroidLink" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "UnnecessaryAndroidLink" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NotURIAndroidFallbackLink" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "BadURISchemeAndroidFallbackLink" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "NotInProjectIosBundleId" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NotInProjectIPadBundleId" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "UnnecessaryIosURLScheme" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NotNumericIosAppStoreId" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "UnnecessaryIosAppStoreId" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NotURIIosFallbackLink" PrefixI False) (U1 :: Type -> Type))))) :+: (((C1 (MetaCons "BadURISchemeIosFallbackLink" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "NotURIIPadFallbackLink" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BadURISchemeIPadFallbackLink" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "BadDebugParam" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BadAdParam" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "DeprecatedParam" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "UnrecognizedParam" PrefixI False) (U1 :: Type -> Type)))) :+: (((C1 (MetaCons "TooLongParam" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NotURISocialImageLink" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "BadURISchemeSocialImageLink" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NotURISocialURL" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "BadURISchemeSocialURL" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "LinkLengthTooLong" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "LinkWithFragments" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NotMatchingIosBundleIdAndStoreId" PrefixI False) (U1 :: Type -> Type))))))

AnalyticsInfo

data AnalyticsInfo Source #

Tracking parameters supported by Dynamic Link.

See: analyticsInfo smart constructor.

Instances
Eq AnalyticsInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Data AnalyticsInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: AnalyticsInfo -> Constr #

dataTypeOf :: AnalyticsInfo -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AnalyticsInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic AnalyticsInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Associated Types

type Rep AnalyticsInfo :: Type -> Type #

ToJSON AnalyticsInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON AnalyticsInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep AnalyticsInfo Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

type Rep AnalyticsInfo = D1 (MetaData "AnalyticsInfo" "Network.Google.FirebaseDynamicLinks.Types.Product" "gogol-firebase-dynamiclinks-0.4.0-KpZx1tfRpXYLAjCU4MRODP" False) (C1 (MetaCons "AnalyticsInfo'" PrefixI True) (S1 (MetaSel (Just "_aiItunesConnectAnalytics") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ITunesConnectAnalytics)) :*: S1 (MetaSel (Just "_aiGooglePlayAnalytics") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GooglePlayAnalytics))))

analyticsInfo :: AnalyticsInfo Source #

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

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

ITunesConnectAnalytics

data ITunesConnectAnalytics Source #

Parameters for iTunes Connect App Analytics.

See: iTunesConnectAnalytics smart constructor.

Instances
Eq ITunesConnectAnalytics Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Data ITunesConnectAnalytics Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Methods

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

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

toConstr :: ITunesConnectAnalytics -> Constr #

dataTypeOf :: ITunesConnectAnalytics -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ITunesConnectAnalytics Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Generic ITunesConnectAnalytics Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

Associated Types

type Rep ITunesConnectAnalytics :: Type -> Type #

ToJSON ITunesConnectAnalytics Source # 
Instance details

Defined in Network.Google.FirebaseDynamicLinks.Types.Product

FromJSON ITunesConnectAnalytics