{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.Fitness.Types
(
fitnessService
, fitnessBodyTemperatureReadScope
, fitnessBodyReadScope
, fitnessNutritionReadScope
, fitnessReProductiveHealthReadScope
, fitnessActivityReadScope
, fitnessReProductiveHealthWriteScope
, fitnessActivityWriteScope
, fitnessBloodPressureWriteScope
, fitnessBodyTemperatureWriteScope
, fitnessOxygenSaturationReadScope
, fitnessBloodGlucoseWriteScope
, fitnessBloodPressureReadScope
, fitnessLocationReadScope
, fitnessLocationWriteScope
, fitnessNutritionWriteScope
, fitnessBodyWriteScope
, fitnessBloodGlucoseReadScope
, fitnessOxygenSaturationWriteScope
, AggregateBucketType (..)
, DataSet
, dataSet
, dsNextPageToken
, dsDataSourceId
, dsPoint
, dsMinStartTimeNs
, dsMaxEndTimeNs
, Application
, application
, aPackageName
, aName
, aVersion
, aDetailsURL
, AggregateResponse
, aggregateResponse
, arBucket
, AggregateBy
, aggregateBy
, abDataTypeName
, abDataSourceId
, DataSourceType (..)
, BucketByTimePeriodType (..)
, BucketByActivity
, bucketByActivity
, bbaMinDurationMillis
, bbaActivityDataSourceId
, AggregateRequest
, aggregateRequest
, arEndTimeMillis
, arFilteredDataQualityStandard
, arAggregateBy
, arBucketBySession
, arBucketByActivityType
, arBucketByTime
, arStartTimeMillis
, arBucketByActivitySegment
, Device
, device
, dManufacturer
, dUid
, dModel
, dVersion
, dType
, Value
, value
, vMapVal
, vFpVal
, vIntVal
, vStringVal
, BucketBySession
, bucketBySession
, bbsMinDurationMillis
, DataPoint
, dataPoint
, dpOriginDataSourceId
, dpRawTimestampNanos
, dpDataTypeName
, dpValue
, dpComputationTimeMillis
, dpEndTimeNanos
, dpModifiedTimeMillis
, dpStartTimeNanos
, ListSessionsResponse
, listSessionsResponse
, lsrNextPageToken
, lsrDeletedSession
, lsrHasMoreData
, lsrSession
, AggregateBucket
, aggregateBucket
, abEndTimeMillis
, abDataSet
, abActivity
, abType
, abStartTimeMillis
, abSession
, MapValue
, mapValue
, mvFpVal
, ListDataSourcesResponse
, listDataSourcesResponse
, ldsrDataSource
, DataTypeField
, dataTypeField
, dtfFormat
, dtfName
, dtfOptional
, AggregateRequestFilteredDataQualityStandardItem (..)
, DataSource
, dataSource
, dsApplication
, dsDevice
, dsDataQualityStandard
, dsName
, dsDataType
, dsType
, dsDataStreamName
, dsDataStreamId
, BucketByTimePeriod
, bucketByTimePeriod
, bbtpValue
, bbtpType
, bbtpTimeZoneId
, DeviceType (..)
, ValueMapValEntry
, valueMapValEntry
, vmveValue
, vmveKey
, BucketByTime
, bucketByTime
, bbtPeriod
, bbtDurationMillis
, DataType
, dataType
, dtField
, dtName
, ListDataPointChangesResponse
, listDataPointChangesResponse
, ldpcrNextPageToken
, ldpcrInsertedDataPoint
, ldpcrDataSourceId
, ldpcrDeletedDataPoint
, Session
, session
, sEndTimeMillis
, sActiveTimeMillis
, sApplication
, sActivityType
, sName
, sModifiedTimeMillis
, sId
, sStartTimeMillis
, sDescription
, DataSourceDataQualityStandardItem (..)
, DataTypeFieldFormat (..)
) where
import Network.Google.Fitness.Types.Product
import Network.Google.Fitness.Types.Sum
import Network.Google.Prelude
fitnessService :: ServiceConfig
fitnessService
= defaultService (ServiceId "fitness:v1")
"www.googleapis.com"
fitnessBodyTemperatureReadScope :: Proxy '["https://www.googleapis.com/auth/fitness.body_temperature.read"]
fitnessBodyTemperatureReadScope = Proxy;
fitnessBodyReadScope :: Proxy '["https://www.googleapis.com/auth/fitness.body.read"]
fitnessBodyReadScope = Proxy;
fitnessNutritionReadScope :: Proxy '["https://www.googleapis.com/auth/fitness.nutrition.read"]
fitnessNutritionReadScope = Proxy;
fitnessReProductiveHealthReadScope :: Proxy '["https://www.googleapis.com/auth/fitness.reproductive_health.read"]
fitnessReProductiveHealthReadScope = Proxy;
fitnessActivityReadScope :: Proxy '["https://www.googleapis.com/auth/fitness.activity.read"]
fitnessActivityReadScope = Proxy;
fitnessReProductiveHealthWriteScope :: Proxy '["https://www.googleapis.com/auth/fitness.reproductive_health.write"]
fitnessReProductiveHealthWriteScope = Proxy;
fitnessActivityWriteScope :: Proxy '["https://www.googleapis.com/auth/fitness.activity.write"]
fitnessActivityWriteScope = Proxy;
fitnessBloodPressureWriteScope :: Proxy '["https://www.googleapis.com/auth/fitness.blood_pressure.write"]
fitnessBloodPressureWriteScope = Proxy;
fitnessBodyTemperatureWriteScope :: Proxy '["https://www.googleapis.com/auth/fitness.body_temperature.write"]
fitnessBodyTemperatureWriteScope = Proxy;
fitnessOxygenSaturationReadScope :: Proxy '["https://www.googleapis.com/auth/fitness.oxygen_saturation.read"]
fitnessOxygenSaturationReadScope = Proxy;
fitnessBloodGlucoseWriteScope :: Proxy '["https://www.googleapis.com/auth/fitness.blood_glucose.write"]
fitnessBloodGlucoseWriteScope = Proxy;
fitnessBloodPressureReadScope :: Proxy '["https://www.googleapis.com/auth/fitness.blood_pressure.read"]
fitnessBloodPressureReadScope = Proxy;
fitnessLocationReadScope :: Proxy '["https://www.googleapis.com/auth/fitness.location.read"]
fitnessLocationReadScope = Proxy;
fitnessLocationWriteScope :: Proxy '["https://www.googleapis.com/auth/fitness.location.write"]
fitnessLocationWriteScope = Proxy;
fitnessNutritionWriteScope :: Proxy '["https://www.googleapis.com/auth/fitness.nutrition.write"]
fitnessNutritionWriteScope = Proxy;
fitnessBodyWriteScope :: Proxy '["https://www.googleapis.com/auth/fitness.body.write"]
fitnessBodyWriteScope = Proxy;
fitnessBloodGlucoseReadScope :: Proxy '["https://www.googleapis.com/auth/fitness.blood_glucose.read"]
fitnessBloodGlucoseReadScope = Proxy;
fitnessOxygenSaturationWriteScope :: Proxy '["https://www.googleapis.com/auth/fitness.oxygen_saturation.write"]
fitnessOxygenSaturationWriteScope = Proxy;