gogol-cloudtrace-0.3.0: Google Cloud Trace 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.CloudTrace

Contents

Description

Send and retrieve trace data from Google Cloud Trace. Data is generated and available by default for all App Engine applications. Data from other applications can be written to Cloud Trace for display, reporting, and analysis.

See: Google Cloud Trace API Reference

Synopsis

Service Configuration

cloudTraceService :: ServiceConfig Source #

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

OAuth Scopes

traceAppendScope :: Proxy '["https://www.googleapis.com/auth/trace.append"] Source #

Write Trace data for a project or application

traceReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/trace.readonly"] Source #

Read Trace data for a project or application

cloudPlatformScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform"] Source #

View and manage your data across Google Cloud Platform services

API Declaration

type CloudTraceAPI = ProjectsTracesListResource :<|> (ProjectsTracesGetResource :<|> ProjectsPatchTracesResource) Source #

Represents the entirety of the methods and resources available for the Google Cloud Trace API service.

Resources

cloudtrace.projects.patchTraces

cloudtrace.projects.traces.get

cloudtrace.projects.traces.list

Types

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 # 

Methods

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

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

Data Empty Source # 

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 # 

Methods

showsPrec :: Int -> Empty -> ShowS #

show :: Empty -> String #

showList :: [Empty] -> ShowS #

Generic Empty Source # 

Associated Types

type Rep Empty :: * -> * #

Methods

from :: Empty -> Rep Empty x #

to :: Rep Empty x -> Empty #

ToJSON Empty Source # 
FromJSON Empty Source # 
type Rep Empty Source # 
type Rep Empty = D1 (MetaData "Empty" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.3.0-AXm4H7plxkQ1zjN3K78iL5" False) (C1 (MetaCons "Empty'" PrefixI False) U1)

empty :: Empty Source #

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

TraceSpanLabels

data TraceSpanLabels Source #

Collection of labels associated with the span.

See: traceSpanLabels smart constructor.

Instances

Eq TraceSpanLabels Source # 
Data TraceSpanLabels Source # 

Methods

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

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

toConstr :: TraceSpanLabels -> Constr #

dataTypeOf :: TraceSpanLabels -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TraceSpanLabels Source # 
Generic TraceSpanLabels Source # 
ToJSON TraceSpanLabels Source # 
FromJSON TraceSpanLabels Source # 
type Rep TraceSpanLabels Source # 
type Rep TraceSpanLabels = D1 (MetaData "TraceSpanLabels" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.3.0-AXm4H7plxkQ1zjN3K78iL5" True) (C1 (MetaCons "TraceSpanLabels'" PrefixI True) (S1 (MetaSel (Just Symbol "_tslAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

traceSpanLabels Source #

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

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

Traces

data Traces Source #

List of new or updated traces.

See: traces smart constructor.

Instances

Eq Traces Source # 

Methods

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

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

Data Traces Source # 

Methods

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

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

toConstr :: Traces -> Constr #

dataTypeOf :: Traces -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Traces Source # 
Generic Traces Source # 

Associated Types

type Rep Traces :: * -> * #

Methods

from :: Traces -> Rep Traces x #

to :: Rep Traces x -> Traces #

ToJSON Traces Source # 
FromJSON Traces Source # 
type Rep Traces Source # 
type Rep Traces = D1 (MetaData "Traces" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.3.0-AXm4H7plxkQ1zjN3K78iL5" True) (C1 (MetaCons "Traces'" PrefixI True) (S1 (MetaSel (Just Symbol "_tTraces") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Trace]))))

traces :: Traces Source #

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

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

tTraces :: Lens' Traces [Trace] Source #

List of traces.

TraceSpan

data TraceSpan Source #

A span represents a single timed event within a trace. Spans can be nested and form a trace tree. Often, a trace contains a root span that describes the end-to-end latency of an operation and, optionally, one or more subspans for its suboperations. Spans do not need to be contiguous. There may be gaps between spans in a trace.

See: traceSpan smart constructor.

Instances

Eq TraceSpan Source # 
Data TraceSpan Source # 

Methods

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

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

toConstr :: TraceSpan -> Constr #

dataTypeOf :: TraceSpan -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TraceSpan Source # 
Generic TraceSpan Source # 

Associated Types

type Rep TraceSpan :: * -> * #

ToJSON TraceSpan Source # 
FromJSON TraceSpan Source # 
type Rep TraceSpan Source # 

traceSpan :: TraceSpan Source #

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

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

tsStartTime :: Lens' TraceSpan (Maybe Text) Source #

Start time of the span in nanoseconds from the UNIX epoch.

tsKind :: Lens' TraceSpan (Maybe Text) Source #

Distinguishes between spans generated in a particular context. For example, two spans with the same name may be distinguished using `RPC_CLIENT` and `RPC_SERVER` to identify queueing latency associated with the span.

tsName :: Lens' TraceSpan (Maybe Text) Source #

Name of the trace. The trace name is sanitized and displayed in the Stackdriver Trace tool in the {% dynamic print site_values.console_name %}. The name may be a method name or some other per-call site name. For the same executable and the same call point, a best practice is to use a consistent name, which makes it easier to correlate cross-trace spans.

tsEndTime :: Lens' TraceSpan (Maybe Text) Source #

End time of the span in nanoseconds from the UNIX epoch.

tsLabels :: Lens' TraceSpan (Maybe TraceSpanLabels) Source #

Collection of labels associated with the span.

tsParentSpanId :: Lens' TraceSpan (Maybe Word64) Source #

ID of the parent span, if any. Optional.

tsSpanId :: Lens' TraceSpan (Maybe Word64) Source #

Identifier for the span. This identifier must be unique within a trace.

ListTracesResponse

data ListTracesResponse Source #

The response message for the `ListTraces` method.

See: listTracesResponse smart constructor.

Instances

Eq ListTracesResponse Source # 
Data ListTracesResponse Source # 

Methods

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

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

toConstr :: ListTracesResponse -> Constr #

dataTypeOf :: ListTracesResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListTracesResponse Source # 
Generic ListTracesResponse Source # 
ToJSON ListTracesResponse Source # 
FromJSON ListTracesResponse Source # 
type Rep ListTracesResponse Source # 
type Rep ListTracesResponse = D1 (MetaData "ListTracesResponse" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.3.0-AXm4H7plxkQ1zjN3K78iL5" False) (C1 (MetaCons "ListTracesResponse'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_ltrNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_ltrTraces") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Trace])))))

listTracesResponse :: ListTracesResponse Source #

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

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

ltrNextPageToken :: Lens' ListTracesResponse (Maybe Text) Source #

If defined, indicates that there are more traces that match the request and that this value should be passed to the next request to continue retrieving additional traces.

ltrTraces :: Lens' ListTracesResponse [Trace] Source #

List of trace records returned.

Trace

data Trace Source #

A trace describes how long it takes for an application to perform an operation. It consists of a set of spans, each of which represent a single timed event within the operation.

See: trace smart constructor.

Instances

Eq Trace Source # 

Methods

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

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

Data Trace Source # 

Methods

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

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

toConstr :: Trace -> Constr #

dataTypeOf :: Trace -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Trace Source # 

Methods

showsPrec :: Int -> Trace -> ShowS #

show :: Trace -> String #

showList :: [Trace] -> ShowS #

Generic Trace Source # 

Associated Types

type Rep Trace :: * -> * #

Methods

from :: Trace -> Rep Trace x #

to :: Rep Trace x -> Trace #

ToJSON Trace Source # 
FromJSON Trace Source # 
type Rep Trace Source # 
type Rep Trace = D1 (MetaData "Trace" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.3.0-AXm4H7plxkQ1zjN3K78iL5" False) (C1 (MetaCons "Trace'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_tTraceId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_tSpans") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [TraceSpan]))) (S1 (MetaSel (Just Symbol "_tProjectId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

trace :: Trace Source #

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

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

tTraceId :: Lens' Trace (Maybe Text) Source #

Globally unique identifier for the trace. This identifier is a 128-bit numeric value formatted as a 32-byte hex string.

tSpans :: Lens' Trace [TraceSpan] Source #

Collection of spans in the trace.

tProjectId :: Lens' Trace (Maybe Text) Source #

Project ID of the Cloud project where the trace data is stored.