gogol-youtube-reporting-0.4.0: Google YouTube Reporting 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.YouTubeReporting.Types

Contents

Description

 
Synopsis

Service Configuration

youTubeReportingService :: ServiceConfig Source #

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

OAuth Scopes

youTubeAnalyticsReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/yt-analytics.readonly"] Source #

View YouTube Analytics reports for your YouTube content

youTubeAnalyticsMonetaryReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/yt-analytics-monetary.readonly"] Source #

View monetary and non-monetary YouTube Analytics reports for your YouTube content

ListReportsResponse

data ListReportsResponse Source #

Response message for ReportingService.ListReports.

See: listReportsResponse smart constructor.

Instances
Eq ListReportsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Data ListReportsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: ListReportsResponse -> Constr #

dataTypeOf :: ListReportsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListReportsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Generic ListReportsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep ListReportsResponse :: Type -> Type #

ToJSON ListReportsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON ListReportsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep ListReportsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep ListReportsResponse = D1 (MetaData "ListReportsResponse" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "ListReportsResponse'" PrefixI True) (S1 (MetaSel (Just "_lrrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lrrReports") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Report]))))

listReportsResponse :: ListReportsResponse Source #

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

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

lrrNextPageToken :: Lens' ListReportsResponse (Maybe Text) Source #

A token to retrieve next page of results. Pass this value in the ListReportsRequest.page_token field in the subsequent call to `ListReports` method to retrieve the next page of results.

lrrReports :: Lens' ListReportsResponse [Report] Source #

The list of report types.

GDataDiffChecksumsResponse

data GDataDiffChecksumsResponse Source #

gdata

See: gDataDiffChecksumsResponse smart constructor.

Instances
Eq GDataDiffChecksumsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Data GDataDiffChecksumsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: GDataDiffChecksumsResponse -> Constr #

dataTypeOf :: GDataDiffChecksumsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GDataDiffChecksumsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Generic GDataDiffChecksumsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep GDataDiffChecksumsResponse :: Type -> Type #

ToJSON GDataDiffChecksumsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON GDataDiffChecksumsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataDiffChecksumsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataDiffChecksumsResponse = D1 (MetaData "GDataDiffChecksumsResponse" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "GDataDiffChecksumsResponse'" PrefixI True) ((S1 (MetaSel (Just "_gddcrChecksumsLocation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataCompositeMedia)) :*: S1 (MetaSel (Just "_gddcrObjectSizeBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) :*: (S1 (MetaSel (Just "_gddcrChunkSizeBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: (S1 (MetaSel (Just "_gddcrObjectVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gddcrObjectLocation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataCompositeMedia))))))

gDataDiffChecksumsResponse :: GDataDiffChecksumsResponse Source #

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

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

GDataObjectId

data GDataObjectId Source #

gdata

See: gDataObjectId smart constructor.

Instances
Eq GDataObjectId Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Data GDataObjectId Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: GDataObjectId -> Constr #

dataTypeOf :: GDataObjectId -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GDataObjectId Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Generic GDataObjectId Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep GDataObjectId :: Type -> Type #

ToJSON GDataObjectId Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON GDataObjectId Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataObjectId Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataObjectId = D1 (MetaData "GDataObjectId" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "GDataObjectId'" PrefixI True) (S1 (MetaSel (Just "_gdoiObjectName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_gdoiBucketName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdoiGeneration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))))

gDataObjectId :: GDataObjectId Source #

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

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

Empty

data Empty Source #

A generic empty message that you can re-use to avoid defining duplicated empty messages in your APIs. A typical example is to use it as the request or the response type of an API method. For instance: service Foo { rpc Bar(google.protobuf.Empty) returns (google.protobuf.Empty); } The JSON representation for `Empty` is empty JSON object `{}`.

See: empty smart constructor.

Instances
Eq Empty Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

Data Empty Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: Empty -> Constr #

dataTypeOf :: Empty -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Empty Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

showsPrec :: Int -> Empty -> ShowS #

show :: Empty -> String #

showList :: [Empty] -> ShowS #

Generic Empty Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep Empty :: Type -> Type #

Methods

from :: Empty -> Rep Empty x #

to :: Rep Empty x -> Empty #

ToJSON Empty Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON Empty Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep Empty Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep Empty = D1 (MetaData "Empty" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "Empty'" PrefixI False) (U1 :: Type -> Type))

empty :: Empty Source #

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

GDataCompositeMediaReferenceType

data GDataCompositeMediaReferenceType Source #

gdata

Constructors

Path

PATH gdata

BlobRef

BLOB_REF gdata

Inline

INLINE gdata

BigstoreRef

BIGSTORE_REF gdata

CosmoBinaryReference

COSMO_BINARY_REFERENCE gdata

Instances
Enum GDataCompositeMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

Eq GDataCompositeMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

Data GDataCompositeMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

Methods

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

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

toConstr :: GDataCompositeMediaReferenceType -> Constr #

dataTypeOf :: GDataCompositeMediaReferenceType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord GDataCompositeMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

Read GDataCompositeMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

Show GDataCompositeMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

Generic GDataCompositeMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

Associated Types

type Rep GDataCompositeMediaReferenceType :: Type -> Type #

Hashable GDataCompositeMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

ToJSON GDataCompositeMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

FromJSON GDataCompositeMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

FromHttpApiData GDataCompositeMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

ToHttpApiData GDataCompositeMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

type Rep GDataCompositeMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

type Rep GDataCompositeMediaReferenceType = D1 (MetaData "GDataCompositeMediaReferenceType" "Network.Google.YouTubeReporting.Types.Sum" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) ((C1 (MetaCons "Path" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BlobRef" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Inline" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "BigstoreRef" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CosmoBinaryReference" PrefixI False) (U1 :: Type -> Type))))

GDataMediaReferenceType

data GDataMediaReferenceType Source #

gdata

Constructors

GDMRTPath

PATH gdata

GDMRTBlobRef

BLOB_REF gdata

GDMRTInline

INLINE gdata

GDMRTGetMedia

GET_MEDIA gdata

GDMRTCompositeMedia

COMPOSITE_MEDIA gdata

GDMRTBigstoreRef

BIGSTORE_REF gdata

GDMRTDiffVersionResponse

DIFF_VERSION_RESPONSE gdata

GDMRTDiffChecksumsResponse

DIFF_CHECKSUMS_RESPONSE gdata

GDMRTDiffDownloadResponse

DIFF_DOWNLOAD_RESPONSE gdata

GDMRTDiffUploadRequest

DIFF_UPLOAD_REQUEST gdata

GDMRTDiffUploadResponse

DIFF_UPLOAD_RESPONSE gdata

GDMRTCosmoBinaryReference

COSMO_BINARY_REFERENCE gdata

GDMRTArbitraryBytes

ARBITRARY_BYTES gdata

Instances
Enum GDataMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

Eq GDataMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

Data GDataMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

Methods

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

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

toConstr :: GDataMediaReferenceType -> Constr #

dataTypeOf :: GDataMediaReferenceType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord GDataMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

Read GDataMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

Show GDataMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

Generic GDataMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

Associated Types

type Rep GDataMediaReferenceType :: Type -> Type #

Hashable GDataMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

ToJSON GDataMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

FromJSON GDataMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

FromHttpApiData GDataMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

ToHttpApiData GDataMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

type Rep GDataMediaReferenceType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

type Rep GDataMediaReferenceType = D1 (MetaData "GDataMediaReferenceType" "Network.Google.YouTubeReporting.Types.Sum" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (((C1 (MetaCons "GDMRTPath" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "GDMRTBlobRef" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "GDMRTInline" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "GDMRTGetMedia" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "GDMRTCompositeMedia" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "GDMRTBigstoreRef" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "GDMRTDiffVersionResponse" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "GDMRTDiffChecksumsResponse" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "GDMRTDiffDownloadResponse" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "GDMRTDiffUploadRequest" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "GDMRTDiffUploadResponse" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "GDMRTCosmoBinaryReference" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "GDMRTArbitraryBytes" PrefixI False) (U1 :: Type -> Type)))))

GDataContentTypeInfo

data GDataContentTypeInfo Source #

gdata

See: gDataContentTypeInfo smart constructor.

Instances
Eq GDataContentTypeInfo Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Data GDataContentTypeInfo Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: GDataContentTypeInfo -> Constr #

dataTypeOf :: GDataContentTypeInfo -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GDataContentTypeInfo Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Generic GDataContentTypeInfo Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep GDataContentTypeInfo :: Type -> Type #

ToJSON GDataContentTypeInfo Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON GDataContentTypeInfo Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataContentTypeInfo Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataContentTypeInfo = D1 (MetaData "GDataContentTypeInfo" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "GDataContentTypeInfo'" PrefixI True) ((S1 (MetaSel (Just "_gdctiFromBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdctiFromFileName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_gdctiFromHeader") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_gdctiBestGuess") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdctiFromURLPath") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

gDataContentTypeInfo :: GDataContentTypeInfo Source #

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

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

GDataMedia

data GDataMedia Source #

gdata

See: gDataMedia smart constructor.

Instances
Eq GDataMedia Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Data GDataMedia Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: GDataMedia -> Constr #

dataTypeOf :: GDataMedia -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GDataMedia Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Generic GDataMedia Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep GDataMedia :: Type -> Type #

ToJSON GDataMedia Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON GDataMedia Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataMedia Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataMedia = D1 (MetaData "GDataMedia" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "GDataMedia'" PrefixI True) ((((S1 (MetaSel (Just "_gdmLength") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: (S1 (MetaSel (Just "_gdmDiffVersionResponse") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataDiffVersionResponse)) :*: S1 (MetaSel (Just "_gdmDiffUploadRequest") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataDiffUploadRequest)))) :*: ((S1 (MetaSel (Just "_gdmBigstoreObjectRef") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: S1 (MetaSel (Just "_gdmHash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_gdmIsPotentialRetry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_gdmCrc32cHash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32)))))) :*: (((S1 (MetaSel (Just "_gdmBlobRef") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: S1 (MetaSel (Just "_gdmPath") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_gdmObjectId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataObjectId)) :*: S1 (MetaSel (Just "_gdmToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: ((S1 (MetaSel (Just "_gdmInline") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: S1 (MetaSel (Just "_gdmMediaId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes))) :*: (S1 (MetaSel (Just "_gdmSha1Hash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: S1 (MetaSel (Just "_gdmHashVerified") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))) :*: (((S1 (MetaSel (Just "_gdmContentTypeInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataContentTypeInfo)) :*: (S1 (MetaSel (Just "_gdmAlgorithm") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdmDiffDownloadResponse") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataDiffDownloadResponse)))) :*: ((S1 (MetaSel (Just "_gdmDiffUploadResponse") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataDiffUploadResponse)) :*: S1 (MetaSel (Just "_gdmDiffChecksumsResponse") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataDiffChecksumsResponse))) :*: (S1 (MetaSel (Just "_gdmBlobstore2Info") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataBlobstore2Info)) :*: S1 (MetaSel (Just "_gdmReferenceType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataMediaReferenceType))))) :*: (((S1 (MetaSel (Just "_gdmTimestamp") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word64))) :*: S1 (MetaSel (Just "_gdmMD5Hash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes))) :*: (S1 (MetaSel (Just "_gdmDownloadParameters") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataDownloadParameters)) :*: S1 (MetaSel (Just "_gdmCosmoBinaryReference") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)))) :*: ((S1 (MetaSel (Just "_gdmFilename") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdmSha256Hash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes))) :*: (S1 (MetaSel (Just "_gdmContentType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdmCompositeMedia") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GDataCompositeMedia]))))))))

Report

data Report Source #

A report's metadata including the URL from which the report itself can be downloaded.

See: report smart constructor.

Instances
Eq Report Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

Data Report Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: Report -> Constr #

dataTypeOf :: Report -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Report Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Generic Report Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep Report :: Type -> Type #

Methods

from :: Report -> Rep Report x #

to :: Rep Report x -> Report #

ToJSON Report Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON Report Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep Report Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

report :: Report Source #

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

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

rJobId :: Lens' Report (Maybe Text) Source #

The ID of the job that created this report.

rStartTime :: Lens' Report (Maybe UTCTime) Source #

The start of the time period that the report instance covers. The value is inclusive.

rDownloadURL :: Lens' Report (Maybe Text) Source #

The URL from which the report can be downloaded (max. 1000 characters).

rEndTime :: Lens' Report (Maybe UTCTime) Source #

The end of the time period that the report instance covers. The value is exclusive.

rId :: Lens' Report (Maybe Text) Source #

The server-generated ID of the report.

rCreateTime :: Lens' Report (Maybe UTCTime) Source #

The date/time when this report was created.

rJobExpireTime :: Lens' Report (Maybe UTCTime) Source #

The date/time when the job this report belongs to will expire/expired.

GDataCompositeMedia

data GDataCompositeMedia Source #

gdata

See: gDataCompositeMedia smart constructor.

Instances
Eq GDataCompositeMedia Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Data GDataCompositeMedia Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: GDataCompositeMedia -> Constr #

dataTypeOf :: GDataCompositeMedia -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GDataCompositeMedia Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Generic GDataCompositeMedia Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep GDataCompositeMedia :: Type -> Type #

ToJSON GDataCompositeMedia Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON GDataCompositeMedia Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataCompositeMedia Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataCompositeMedia = D1 (MetaData "GDataCompositeMedia" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "GDataCompositeMedia'" PrefixI True) (((S1 (MetaSel (Just "_gdcmLength") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_gdcmCrc32cHash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Word32)))) :*: (S1 (MetaSel (Just "_gdcmBlobRef") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: (S1 (MetaSel (Just "_gdcmPath") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gdcmObjectId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataObjectId))))) :*: ((S1 (MetaSel (Just "_gdcmInline") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: (S1 (MetaSel (Just "_gdcmSha1Hash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: S1 (MetaSel (Just "_gdcmBlobstore2Info") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataBlobstore2Info)))) :*: (S1 (MetaSel (Just "_gdcmReferenceType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataCompositeMediaReferenceType)) :*: (S1 (MetaSel (Just "_gdcmMD5Hash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: S1 (MetaSel (Just "_gdcmCosmoBinaryReference") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)))))))

gDataCompositeMedia :: GDataCompositeMedia Source #

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

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

GDataDownloadParameters

data GDataDownloadParameters Source #

gdata

See: gDataDownloadParameters smart constructor.

Instances
Eq GDataDownloadParameters Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Data GDataDownloadParameters Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: GDataDownloadParameters -> Constr #

dataTypeOf :: GDataDownloadParameters -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GDataDownloadParameters Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Generic GDataDownloadParameters Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep GDataDownloadParameters :: Type -> Type #

ToJSON GDataDownloadParameters Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON GDataDownloadParameters Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataDownloadParameters Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataDownloadParameters = D1 (MetaData "GDataDownloadParameters" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "GDataDownloadParameters'" PrefixI True) (S1 (MetaSel (Just "_gddpIgnoreRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_gddpAllowGzipCompression") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))

gDataDownloadParameters :: GDataDownloadParameters Source #

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

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

ListReportTypesResponse

data ListReportTypesResponse Source #

Response message for ReportingService.ListReportTypes.

See: listReportTypesResponse smart constructor.

Instances
Eq ListReportTypesResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Data ListReportTypesResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: ListReportTypesResponse -> Constr #

dataTypeOf :: ListReportTypesResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListReportTypesResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Generic ListReportTypesResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep ListReportTypesResponse :: Type -> Type #

ToJSON ListReportTypesResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON ListReportTypesResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep ListReportTypesResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep ListReportTypesResponse = D1 (MetaData "ListReportTypesResponse" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "ListReportTypesResponse'" PrefixI True) (S1 (MetaSel (Just "_lrtrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_lrtrReportTypes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ReportType]))))

listReportTypesResponse :: ListReportTypesResponse Source #

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

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

lrtrNextPageToken :: Lens' ListReportTypesResponse (Maybe Text) Source #

A token to retrieve next page of results. Pass this value in the ListReportTypesRequest.page_token field in the subsequent call to `ListReportTypes` method to retrieve the next page of results.

GDataBlobstore2Info

data GDataBlobstore2Info Source #

gdata

See: gDataBlobstore2Info smart constructor.

Instances
Eq GDataBlobstore2Info Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Data GDataBlobstore2Info Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: GDataBlobstore2Info -> Constr #

dataTypeOf :: GDataBlobstore2Info -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GDataBlobstore2Info Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Generic GDataBlobstore2Info Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep GDataBlobstore2Info :: Type -> Type #

ToJSON GDataBlobstore2Info Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON GDataBlobstore2Info Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataBlobstore2Info Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataBlobstore2Info = D1 (MetaData "GDataBlobstore2Info" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "GDataBlobstore2Info'" PrefixI True) ((S1 (MetaSel (Just "_gdbiBlobGeneration") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_gdbiBlobId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_gdbiReadToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_gdbiDownloadReadHandle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes)) :*: S1 (MetaSel (Just "_gdbiUploadMetadataContainer") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes))))))

gDataBlobstore2Info :: GDataBlobstore2Info Source #

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

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

Job

data Job Source #

A job creating reports of a specific type.

See: job smart constructor.

Instances
Eq Job Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

Data Job Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: Job -> Constr #

dataTypeOf :: Job -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Job Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

showsPrec :: Int -> Job -> ShowS #

show :: Job -> String #

showList :: [Job] -> ShowS #

Generic Job Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep Job :: Type -> Type #

Methods

from :: Job -> Rep Job x #

to :: Rep Job x -> Job #

ToJSON Job Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON Job Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep Job Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep Job = D1 (MetaData "Job" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "Job'" PrefixI True) ((S1 (MetaSel (Just "_jName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_jId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_jSystemManaged") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))) :*: (S1 (MetaSel (Just "_jReportTypeId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_jExpireTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_jCreateTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))))))

job :: Job Source #

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

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

jName :: Lens' Job (Maybe Text) Source #

The name of the job (max. 100 characters).

jId :: Lens' Job (Maybe Text) Source #

The server-generated ID of the job (max. 40 characters).

jSystemManaged :: Lens' Job (Maybe Bool) Source #

True if this a system-managed job that cannot be modified by the user; otherwise false.

jReportTypeId :: Lens' Job (Maybe Text) Source #

The type of reports this job creates. Corresponds to the ID of a ReportType.

jExpireTime :: Lens' Job (Maybe UTCTime) Source #

The date/time when this job will expire/expired. After a job expired, no new reports are generated.

jCreateTime :: Lens' Job (Maybe UTCTime) Source #

The creation date/time of the job.

GDataDiffUploadResponse

data GDataDiffUploadResponse Source #

gdata

See: gDataDiffUploadResponse smart constructor.

Instances
Eq GDataDiffUploadResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Data GDataDiffUploadResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: GDataDiffUploadResponse -> Constr #

dataTypeOf :: GDataDiffUploadResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GDataDiffUploadResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Generic GDataDiffUploadResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep GDataDiffUploadResponse :: Type -> Type #

ToJSON GDataDiffUploadResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON GDataDiffUploadResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataDiffUploadResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataDiffUploadResponse = D1 (MetaData "GDataDiffUploadResponse" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "GDataDiffUploadResponse'" PrefixI True) (S1 (MetaSel (Just "_gddurOriginalObject") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataCompositeMedia)) :*: S1 (MetaSel (Just "_gddurObjectVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

gDataDiffUploadResponse :: GDataDiffUploadResponse Source #

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

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

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

Eq Xgafv Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

Methods

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

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

Data Xgafv Source # 
Instance details

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

Show Xgafv Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

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

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Sum

type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.YouTubeReporting.Types.Sum" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "X1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "X2" PrefixI False) (U1 :: Type -> Type))

GDataDiffDownloadResponse

data GDataDiffDownloadResponse Source #

gdata

See: gDataDiffDownloadResponse smart constructor.

Instances
Eq GDataDiffDownloadResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Data GDataDiffDownloadResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: GDataDiffDownloadResponse -> Constr #

dataTypeOf :: GDataDiffDownloadResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GDataDiffDownloadResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Generic GDataDiffDownloadResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep GDataDiffDownloadResponse :: Type -> Type #

ToJSON GDataDiffDownloadResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON GDataDiffDownloadResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataDiffDownloadResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataDiffDownloadResponse = D1 (MetaData "GDataDiffDownloadResponse" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" True) (C1 (MetaCons "GDataDiffDownloadResponse'" PrefixI True) (S1 (MetaSel (Just "_gdddrObjectLocation") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe GDataCompositeMedia))))

gDataDiffDownloadResponse :: GDataDiffDownloadResponse Source #

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

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

ListJobsResponse

data ListJobsResponse Source #

Response message for ReportingService.ListJobs.

See: listJobsResponse smart constructor.

Instances
Eq ListJobsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Data ListJobsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: ListJobsResponse -> Constr #

dataTypeOf :: ListJobsResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListJobsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Generic ListJobsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep ListJobsResponse :: Type -> Type #

ToJSON ListJobsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON ListJobsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep ListJobsResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep ListJobsResponse = D1 (MetaData "ListJobsResponse" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "ListJobsResponse'" PrefixI True) (S1 (MetaSel (Just "_ljrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ljrJobs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Job]))))

listJobsResponse :: ListJobsResponse Source #

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

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

ljrNextPageToken :: Lens' ListJobsResponse (Maybe Text) Source #

A token to retrieve next page of results. Pass this value in the ListJobsRequest.page_token field in the subsequent call to `ListJobs` method to retrieve the next page of results.

ljrJobs :: Lens' ListJobsResponse [Job] Source #

The list of jobs.

GDataDiffUploadRequest

data GDataDiffUploadRequest Source #

gdata

See: gDataDiffUploadRequest smart constructor.

Instances
Eq GDataDiffUploadRequest Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Data GDataDiffUploadRequest Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: GDataDiffUploadRequest -> Constr #

dataTypeOf :: GDataDiffUploadRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GDataDiffUploadRequest Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Generic GDataDiffUploadRequest Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep GDataDiffUploadRequest :: Type -> Type #

ToJSON GDataDiffUploadRequest Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON GDataDiffUploadRequest Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataDiffUploadRequest Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataDiffUploadRequest = D1 (MetaData "GDataDiffUploadRequest" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "GDataDiffUploadRequest'" PrefixI True) (S1 (MetaSel (Just "_gChecksumsInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataCompositeMedia)) :*: (S1 (MetaSel (Just "_gObjectVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_gObjectInfo") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GDataCompositeMedia)))))

gDataDiffUploadRequest :: GDataDiffUploadRequest Source #

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

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

GDataDiffVersionResponse

data GDataDiffVersionResponse Source #

gdata

See: gDataDiffVersionResponse smart constructor.

Instances
Eq GDataDiffVersionResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Data GDataDiffVersionResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: GDataDiffVersionResponse -> Constr #

dataTypeOf :: GDataDiffVersionResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GDataDiffVersionResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Generic GDataDiffVersionResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep GDataDiffVersionResponse :: Type -> Type #

ToJSON GDataDiffVersionResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON GDataDiffVersionResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataDiffVersionResponse Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep GDataDiffVersionResponse = D1 (MetaData "GDataDiffVersionResponse" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "GDataDiffVersionResponse'" PrefixI True) (S1 (MetaSel (Just "_gddvrObjectSizeBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_gddvrObjectVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

gDataDiffVersionResponse :: GDataDiffVersionResponse Source #

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

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

ReportType

data ReportType Source #

A report type.

See: reportType smart constructor.

Instances
Eq ReportType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Data ReportType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Methods

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

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

toConstr :: ReportType -> Constr #

dataTypeOf :: ReportType -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ReportType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Generic ReportType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

Associated Types

type Rep ReportType :: Type -> Type #

ToJSON ReportType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

FromJSON ReportType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep ReportType Source # 
Instance details

Defined in Network.Google.YouTubeReporting.Types.Product

type Rep ReportType = D1 (MetaData "ReportType" "Network.Google.YouTubeReporting.Types.Product" "gogol-youtube-reporting-0.4.0-Dr9CDcNGMDRA1BwOES1tMd" False) (C1 (MetaCons "ReportType'" PrefixI True) ((S1 (MetaSel (Just "_rtName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_rtId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_rtDeprecateTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_rtSystemManaged") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))

reportType :: ReportType Source #

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

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

rtName :: Lens' ReportType (Maybe Text) Source #

The name of the report type (max. 100 characters).

rtId :: Lens' ReportType (Maybe Text) Source #

The ID of the report type (max. 100 characters).

rtDeprecateTime :: Lens' ReportType (Maybe UTCTime) Source #

The date/time when this report type was/will be deprecated.

rtSystemManaged :: Lens' ReportType (Maybe Bool) Source #

True if this a system-managed report type; otherwise false. Reporting jobs for system-managed report types are created automatically and can thus not be used in the `CreateJob` method.