gogol-adexperiencereport-0.4.0: Google Ad Experience Report 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.AdExperienceReport

Contents

Description

Views Ad Experience Report data, and gets a list of sites that have a significant number of annoying ads.

See: Ad Experience Report API Reference

Synopsis

Service Configuration

adExperienceReportService :: ServiceConfig Source #

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

OAuth Scopes

xapiZooScope :: Proxy '["https://www.googleapis.com/auth/xapi.zoo"] Source #

Test scope for access to the Zoo service

API Declaration

type AdExperienceReportAPI = ViolatingSitesListResource :<|> SitesGetResource Source #

Represents the entirety of the methods and resources available for the Ad Experience Report API service.

Resources

adexperiencereport.sites.get

adexperiencereport.violatingSites.list

Types

SiteSummaryResponse

data SiteSummaryResponse Source #

Response message for GetSiteSummary.

See: siteSummaryResponse smart constructor.

Instances
Eq SiteSummaryResponse Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

Data SiteSummaryResponse Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

Methods

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

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

toConstr :: SiteSummaryResponse -> Constr #

dataTypeOf :: SiteSummaryResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SiteSummaryResponse Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

Generic SiteSummaryResponse Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

Associated Types

type Rep SiteSummaryResponse :: Type -> Type #

ToJSON SiteSummaryResponse Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

FromJSON SiteSummaryResponse Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

type Rep SiteSummaryResponse Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

type Rep SiteSummaryResponse = D1 (MetaData "SiteSummaryResponse" "Network.Google.AdExperienceReport.Types.Product" "gogol-adexperiencereport-0.4.0-2MG9LPSyCiQ5HQ0Dibw0bQ" False) (C1 (MetaCons "SiteSummaryResponse'" PrefixI True) (S1 (MetaSel (Just "_ssrMobileSummary") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PlatformSummary)) :*: (S1 (MetaSel (Just "_ssrReviewedSite") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ssrDesktopSummary") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PlatformSummary)))))

siteSummaryResponse :: SiteSummaryResponse Source #

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

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

ssrMobileSummary :: Lens' SiteSummaryResponse (Maybe PlatformSummary) Source #

Summary for the mobile review of the site.

ssrReviewedSite :: Lens' SiteSummaryResponse (Maybe Text) Source #

The name of the site reviewed.

ssrDesktopSummary :: Lens' SiteSummaryResponse (Maybe PlatformSummary) Source #

Summary for the desktop review of the site.

PlatformSummaryFilterStatus

data PlatformSummaryFilterStatus Source #

The ad filtering status of the site.

Constructors

Unknown

UNKNOWN N/A.

ON

ON Ad filtering is on.

Off

OFF Ad filtering is off.

Paused

PAUSED Ad filtering is paused.

Pending

PENDING Ad filtering is pending.

Instances
Enum PlatformSummaryFilterStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

Eq PlatformSummaryFilterStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

Data PlatformSummaryFilterStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

Methods

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

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

toConstr :: PlatformSummaryFilterStatus -> Constr #

dataTypeOf :: PlatformSummaryFilterStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord PlatformSummaryFilterStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

Read PlatformSummaryFilterStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

Show PlatformSummaryFilterStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

Generic PlatformSummaryFilterStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

Associated Types

type Rep PlatformSummaryFilterStatus :: Type -> Type #

Hashable PlatformSummaryFilterStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

ToJSON PlatformSummaryFilterStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

FromJSON PlatformSummaryFilterStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

FromHttpApiData PlatformSummaryFilterStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

ToHttpApiData PlatformSummaryFilterStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

type Rep PlatformSummaryFilterStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

type Rep PlatformSummaryFilterStatus = D1 (MetaData "PlatformSummaryFilterStatus" "Network.Google.AdExperienceReport.Types.Sum" "gogol-adexperiencereport-0.4.0-2MG9LPSyCiQ5HQ0Dibw0bQ" False) ((C1 (MetaCons "Unknown" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ON" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Off" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Paused" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Pending" PrefixI False) (U1 :: Type -> Type))))

ViolatingSitesResponse

data ViolatingSitesResponse Source #

Response message for ListViolatingSites.

See: violatingSitesResponse smart constructor.

Instances
Eq ViolatingSitesResponse Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

Data ViolatingSitesResponse Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

Methods

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

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

toConstr :: ViolatingSitesResponse -> Constr #

dataTypeOf :: ViolatingSitesResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ViolatingSitesResponse Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

Generic ViolatingSitesResponse Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

Associated Types

type Rep ViolatingSitesResponse :: Type -> Type #

ToJSON ViolatingSitesResponse Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

FromJSON ViolatingSitesResponse Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

type Rep ViolatingSitesResponse Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

type Rep ViolatingSitesResponse = D1 (MetaData "ViolatingSitesResponse" "Network.Google.AdExperienceReport.Types.Product" "gogol-adexperiencereport-0.4.0-2MG9LPSyCiQ5HQ0Dibw0bQ" True) (C1 (MetaCons "ViolatingSitesResponse'" PrefixI True) (S1 (MetaSel (Just "_vsrViolatingSites") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [SiteSummaryResponse]))))

violatingSitesResponse :: ViolatingSitesResponse Source #

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

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

vsrViolatingSites :: Lens' ViolatingSitesResponse [SiteSummaryResponse] Source #

A list of summaries of violating sites.

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

Eq Xgafv Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

Methods

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

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

Data Xgafv Source # 
Instance details

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

Show Xgafv Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

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

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.AdExperienceReport.Types.Sum" "gogol-adexperiencereport-0.4.0-2MG9LPSyCiQ5HQ0Dibw0bQ" False) (C1 (MetaCons "X1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "X2" PrefixI False) (U1 :: Type -> Type))

PlatformSummary

data PlatformSummary Source #

Summary of the ad experience rating of a site for a specific platform.

See: platformSummary smart constructor.

Instances
Eq PlatformSummary Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

Data PlatformSummary Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

Methods

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

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

toConstr :: PlatformSummary -> Constr #

dataTypeOf :: PlatformSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PlatformSummary Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

Generic PlatformSummary Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

Associated Types

type Rep PlatformSummary :: Type -> Type #

ToJSON PlatformSummary Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

FromJSON PlatformSummary Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

type Rep PlatformSummary Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Product

type Rep PlatformSummary = D1 (MetaData "PlatformSummary" "Network.Google.AdExperienceReport.Types.Product" "gogol-adexperiencereport-0.4.0-2MG9LPSyCiQ5HQ0Dibw0bQ" False) (C1 (MetaCons "PlatformSummary'" PrefixI True) ((S1 (MetaSel (Just "_psEnforcementTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: (S1 (MetaSel (Just "_psLastChangeTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_psFilterStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PlatformSummaryFilterStatus)))) :*: ((S1 (MetaSel (Just "_psUnderReview") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_psBetterAdsStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PlatformSummaryBetterAdsStatus))) :*: (S1 (MetaSel (Just "_psReportURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_psRegion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))))))

platformSummary :: PlatformSummary Source #

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

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

psEnforcementTime :: Lens' PlatformSummary (Maybe UTCTime) Source #

The date on which ad filtering begins.

psLastChangeTime :: Lens' PlatformSummary (Maybe UTCTime) Source #

The last time that the site changed status.

psUnderReview :: Lens' PlatformSummary (Maybe Bool) Source #

Whether the site is currently under review.

psBetterAdsStatus :: Lens' PlatformSummary (Maybe PlatformSummaryBetterAdsStatus) Source #

The status of the site reviewed for the Better Ads Standards.

psReportURL :: Lens' PlatformSummary (Maybe Text) Source #

A link that leads to a full ad experience report.

psRegion :: Lens' PlatformSummary [Text] Source #

The assigned regions for the site and platform.

PlatformSummaryBetterAdsStatus

data PlatformSummaryBetterAdsStatus Source #

The status of the site reviewed for the Better Ads Standards.

Constructors

PSBASUnknown

UNKNOWN Not reviewed.

PSBASPassing

PASSING Passing.

PSBASWarning

WARNING Warning.

PSBASFailing

FAILING Failing.

Instances
Enum PlatformSummaryBetterAdsStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

Eq PlatformSummaryBetterAdsStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

Data PlatformSummaryBetterAdsStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

Methods

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

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

toConstr :: PlatformSummaryBetterAdsStatus -> Constr #

dataTypeOf :: PlatformSummaryBetterAdsStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord PlatformSummaryBetterAdsStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

Read PlatformSummaryBetterAdsStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

Show PlatformSummaryBetterAdsStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

Generic PlatformSummaryBetterAdsStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

Associated Types

type Rep PlatformSummaryBetterAdsStatus :: Type -> Type #

Hashable PlatformSummaryBetterAdsStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

ToJSON PlatformSummaryBetterAdsStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

FromJSON PlatformSummaryBetterAdsStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

FromHttpApiData PlatformSummaryBetterAdsStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

ToHttpApiData PlatformSummaryBetterAdsStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

type Rep PlatformSummaryBetterAdsStatus Source # 
Instance details

Defined in Network.Google.AdExperienceReport.Types.Sum

type Rep PlatformSummaryBetterAdsStatus = D1 (MetaData "PlatformSummaryBetterAdsStatus" "Network.Google.AdExperienceReport.Types.Sum" "gogol-adexperiencereport-0.4.0-2MG9LPSyCiQ5HQ0Dibw0bQ" False) ((C1 (MetaCons "PSBASUnknown" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PSBASPassing" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "PSBASWarning" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PSBASFailing" PrefixI False) (U1 :: Type -> Type)))