{-# LANGUAGE DataKinds #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE TypeOperators #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-duplicate-exports #-}
module Network.Google.LatencyTest
(
latencyTestService
, monitoringReadOnlyScope
, LatencyTestAPI
, module Network.Google.Resource.Cloudlatencytest.Statscollection.Updateaggregatedstats
, module Network.Google.Resource.Cloudlatencytest.Statscollection.Updatestats
, IntValue
, intValue
, ivValue
, ivLabel
, DoubleValue
, doubleValue
, dvValue
, dvLabel
, StringValue
, stringValue
, svValue
, svLabel
, AggregatedStatsReply
, aggregatedStatsReply
, asrTestValue
, Stats
, stats
, sTime
, sDoubleValues
, sStringValues
, sIntValues
, AggregatedStats
, aggregatedStats
, asStats
, StatsReply
, statsReply
, srTestValue
) where
import Network.Google.LatencyTest.Types
import Network.Google.Prelude
import Network.Google.Resource.Cloudlatencytest.Statscollection.Updateaggregatedstats
import Network.Google.Resource.Cloudlatencytest.Statscollection.Updatestats
type LatencyTestAPI =
StatscollectionUpdatestatsResource :<|>
StatscollectionUpdateaggregatedstatsResource