{-# LANGUAGE DataKinds #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE TypeOperators #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-duplicate-exports #-}
module Network.Google.Reports
(
reportsService
, adminReportsUsageReadOnlyScope
, adminReportsAuditReadOnlyScope
, ReportsAPI
, module Network.Google.Resource.Admin.Channels.Stop
, module Network.Google.Resource.Reports.Activities.List
, module Network.Google.Resource.Reports.Activities.Watch
, module Network.Google.Resource.Reports.CustomerUsageReports.Get
, module Network.Google.Resource.Reports.EntityUsageReports.Get
, module Network.Google.Resource.Reports.UserUsageReport.Get
, UsageReportParametersItem
, usageReportParametersItem
, urpiDatetimeValue
, urpiBoolValue
, urpiIntValue
, urpiStringValue
, urpiName
, urpiMsgValue
, ActivityId
, activityId
, aiTime
, aiUniqueQualifier
, aiCustomerId
, aiApplicationName
, UsageReports
, usageReports
, urEtag
, urNextPageToken
, urUsageReports
, urKind
, urWarnings
, UsageReportParametersItemMsgValueItem
, usageReportParametersItemMsgValueItem
, urpimviAddtional
, Activities
, activities
, aEtag
, aNextPageToken
, aKind
, aItems
, Channel
, channel
, cResourceURI
, cResourceId
, cKind
, cExpiration
, cToken
, cAddress
, cPayload
, cParams
, cId
, cType
, UsageReport
, usageReport
, uEtag
, uKind
, uDate
, uParameters
, uEntity
, UsageReportsWarningsItemDataItem
, usageReportsWarningsItemDataItem
, urwidiValue
, urwidiKey
, UsageReportsWarningsItem
, usageReportsWarningsItem
, urwiData
, urwiCode
, urwiMessage
, ActivityEventsItem
, activityEventsItem
, aeiName
, aeiParameters
, aeiType
, ChannelParams
, channelParams
, cpAddtional
, Activity
, activity
, actEtag
, actIPAddress
, actKind
, actActor
, actOwnerDomain
, actEvents
, actId
, UsageReportEntity
, usageReportEntity
, ureProFileId
, ureCustomerId
, ureUserEmail
, ureType
, ureEntityId
, ActivityEventsItemParametersItem
, activityEventsItemParametersItem
, aeipiBoolValue
, aeipiIntValue
, aeipiValue
, aeipiMultiIntValue
, aeipiName
, aeipiMultiValue
, ActivityActor
, activityActor
, aaEmail
, aaCallerType
, aaProFileId
, aaKey
) where
import Network.Google.Prelude
import Network.Google.Reports.Types
import Network.Google.Resource.Admin.Channels.Stop
import Network.Google.Resource.Reports.Activities.List
import Network.Google.Resource.Reports.Activities.Watch
import Network.Google.Resource.Reports.CustomerUsageReports.Get
import Network.Google.Resource.Reports.EntityUsageReports.Get
import Network.Google.Resource.Reports.UserUsageReport.Get
type ReportsAPI =
ChannelsStopResource :<|> ActivitiesListResource :<|>
ActivitiesWatchResource
:<|> CustomerUsageReportsGetResource
:<|> UserUsageReportGetResource
:<|> EntityUsageReportsGetResource