gogol-cloudtrace-0.4.0: Google Stackdriver 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

Sends application trace data to Stackdriver Trace for viewing. Trace data is collected for all App Engine applications by default. Trace data from other applications can be provided using this API. This library is used to interact with the Trace API directly. If you are looking to instrument your application for Stackdriver Trace, we recommend using OpenCensus.

See: Stackdriver Trace API Reference

Synopsis

Service Configuration

cloudTraceService :: ServiceConfig Source #

Default request referring to version v2 of the Stackdriver 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

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

View and manage your data across Google Cloud Platform services

API Declaration

type CloudTraceAPI = ProjectsTracesSpansCreateSpanResource :<|> ProjectsTracesBatchWriteResource Source #

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

Resources

cloudtrace.projects.traces.batchWrite

cloudtrace.projects.traces.spans.createSpan

Types

Span

data Span Source #

A span represents a single operation within a trace. Spans can be nested to form a trace tree. Often, a trace contains a root span that describes the end-to-end latency, and one or more subspans for its sub-operations. A trace can also contain multiple root spans, or none at all. Spans do not need to be contiguous—there may be gaps or overlaps between spans in a trace.

See: span smart constructor.

Instances
Eq Span Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

Data Span Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

toConstr :: Span -> Constr #

dataTypeOf :: Span -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Span Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

showsPrec :: Int -> Span -> ShowS #

show :: Span -> String #

showList :: [Span] -> ShowS #

Generic Span Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Associated Types

type Rep Span :: Type -> Type #

Methods

from :: Span -> Rep Span x #

to :: Rep Span x -> Span #

ToJSON Span Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

FromJSON Span Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep Span Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep Span = D1 (MetaData "Span" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" False) (C1 (MetaCons "Span'" PrefixI True) (((S1 (MetaSel (Just "_sStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Status)) :*: (S1 (MetaSel (Just "_sStartTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_sChildSpanCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))) :*: (S1 (MetaSel (Just "_sSameProcessAsParentSpan") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_sName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_sStackTrace") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe StackTrace))))) :*: ((S1 (MetaSel (Just "_sAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Attributes)) :*: (S1 (MetaSel (Just "_sEndTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')) :*: S1 (MetaSel (Just "_sTimeEvents") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TimeEvents)))) :*: ((S1 (MetaSel (Just "_sDisplayName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TruncatableString)) :*: S1 (MetaSel (Just "_sParentSpanId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_sLinks") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Links)) :*: S1 (MetaSel (Just "_sSpanId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

span :: Span Source #

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

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

sStatus :: Lens' Span (Maybe Status) Source #

An optional final status for this span.

sStartTime :: Lens' Span (Maybe UTCTime) Source #

The start time of the span. On the client side, this is the time kept by the local machine where the span execution starts. On the server side, this is the time when the server's application handler starts running.

sChildSpanCount :: Lens' Span (Maybe Int32) Source #

An optional number of child spans that were generated while this span was active. If set, allows implementation to detect missing child spans.

sSameProcessAsParentSpan :: Lens' Span (Maybe Bool) Source #

(Optional) Set this parameter to indicate whether this span is in the same process as its parent. If you do not set this parameter, Stackdriver Trace is unable to take advantage of this helpful information.

sName :: Lens' Span (Maybe Text) Source #

The resource name of the span in the following format: projects/[PROJECT_ID]/traces/[TRACE_ID]/spans/SPAN_ID is a unique identifier for a trace within a project; it is a 32-character hexadecimal encoding of a 16-byte array. [SPAN_ID] is a unique identifier for a span within a trace; it is a 16-character hexadecimal encoding of an 8-byte array.

sStackTrace :: Lens' Span (Maybe StackTrace) Source #

Stack trace captured at the start of the span.

sAttributes :: Lens' Span (Maybe Attributes) Source #

A set of attributes on the span. You can have up to 32 attributes per span.

sEndTime :: Lens' Span (Maybe UTCTime) Source #

The end time of the span. On the client side, this is the time kept by the local machine where the span execution ends. On the server side, this is the time when the server application handler stops running.

sTimeEvents :: Lens' Span (Maybe TimeEvents) Source #

A set of time events. You can have up to 32 annotations and 128 message events per span.

sDisplayName :: Lens' Span (Maybe TruncatableString) Source #

A description of the span's operation (up to 128 bytes). Stackdriver Trace displays the description in the Google Cloud Platform Console. For example, the display name can be a qualified method name or a file name and a line number where the operation is called. A best practice is to use the same display name within an application and at the same call point. This makes it easier to correlate spans in different traces.

sParentSpanId :: Lens' Span (Maybe Text) Source #

The [SPAN_ID] of this span's parent span. If this is a root span, then this field must be empty.

sLinks :: Lens' Span (Maybe Links) Source #

Links associated with the span. You can have up to 128 links per Span.

sSpanId :: Lens' Span (Maybe Text) Source #

The [SPAN_ID] portion of the span's resource name.

TruncatableString

data TruncatableString Source #

Represents a string that might be shortened to a specified length.

See: truncatableString smart constructor.

Instances
Eq TruncatableString Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Data TruncatableString Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

toConstr :: TruncatableString -> Constr #

dataTypeOf :: TruncatableString -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TruncatableString Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Generic TruncatableString Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Associated Types

type Rep TruncatableString :: Type -> Type #

ToJSON TruncatableString Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

FromJSON TruncatableString Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep TruncatableString Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep TruncatableString = D1 (MetaData "TruncatableString" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" False) (C1 (MetaCons "TruncatableString'" PrefixI True) (S1 (MetaSel (Just "_tsValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_tsTruncatedByteCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))

truncatableString :: TruncatableString Source #

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

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

tsValue :: Lens' TruncatableString (Maybe Text) Source #

The shortened string. For example, if the original string is 500 bytes long and the limit of the string is 128 bytes, then `value` contains the first 128 bytes of the 500-byte string. Truncation always happens on a UTF8 character boundary. If there are multi-byte characters in the string, then the length of the shortened string might be less than the size limit.

tsTruncatedByteCount :: Lens' TruncatableString (Maybe Int32) Source #

The number of bytes removed from the original string. If this value is 0, then the string was not shortened.

Status

data Status Source #

The `Status` type defines a logical error model that is suitable for different programming environments, including REST APIs and RPC APIs. It is used by gRPC. The error model is designed to be: - Simple to use and understand for most users - Flexible enough to meet unexpected needs # Overview The `Status` message contains three pieces of data: error code, error message, and error details. The error code should be an enum value of google.rpc.Code, but it may accept additional error codes if needed. The error message should be a developer-facing English message that helps developers *understand* and *resolve* the error. If a localized user-facing error message is needed, put the localized message in the error details or localize it in the client. The optional error details may contain arbitrary information about the error. There is a predefined set of error detail types in the package `google.rpc` that can be used for common error conditions. # Language mapping The `Status` message is the logical representation of the error model, but it is not necessarily the actual wire format. When the `Status` message is exposed in different client libraries and different wire protocols, it can be mapped differently. For example, it will likely be mapped to some exceptions in Java, but more likely mapped to some error codes in C. # Other uses The error model and the `Status` message can be used in a variety of environments, either with or without APIs, to provide a consistent developer experience across different environments. Example uses of this error model include: - Partial errors. If a service needs to return partial errors to the client, it may embed the `Status` in the normal response to indicate the partial errors. - Workflow errors. A typical workflow has multiple steps. Each step may have a `Status` message for error reporting. - Batch operations. If a client uses batch request and batch response, the `Status` message should be used directly inside batch response, one for each error sub-response. - Asynchronous operations. If an API call embeds asynchronous operation results in its response, the status of those operations should be represented directly using the `Status` message. - Logging. If some API errors are stored in logs, the message `Status` could be used directly after any stripping needed for security/privacy reasons.

See: status smart constructor.

Instances
Eq Status Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

Data Status Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

toConstr :: Status -> Constr #

dataTypeOf :: Status -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Status Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Generic Status Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Associated Types

type Rep Status :: Type -> Type #

Methods

from :: Status -> Rep Status x #

to :: Rep Status x -> Status #

ToJSON Status Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

FromJSON Status Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep Status Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep Status = D1 (MetaData "Status" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" False) (C1 (MetaCons "Status'" PrefixI True) (S1 (MetaSel (Just "_sDetails") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [StatusDetailsItem])) :*: (S1 (MetaSel (Just "_sCode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_sMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

status :: Status Source #

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

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

sDetails :: Lens' Status [StatusDetailsItem] Source #

A list of messages that carry the error details. There is a common set of message types for APIs to use.

sCode :: Lens' Status (Maybe Int32) Source #

The status code, which should be an enum value of google.rpc.Code.

sMessage :: Lens' Status (Maybe Text) Source #

A developer-facing error message, which should be in English. Any user-facing error message should be localized and sent in the google.rpc.Status.details field, or localized by the client.

AttributesAttributeMap

data AttributesAttributeMap Source #

The set of attributes. Each attribute's key can be up to 128 bytes long. The value can be a string up to 256 bytes, a signed 64-bit integer, or the Boolean values `true` and `false`. For example: "/instance_id": "my-instance" "/http/user_agent": "" "/http/request_bytes": 300 "abc.com/myattribute": true

See: attributesAttributeMap smart constructor.

Instances
Eq AttributesAttributeMap Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Data AttributesAttributeMap Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

toConstr :: AttributesAttributeMap -> Constr #

dataTypeOf :: AttributesAttributeMap -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AttributesAttributeMap Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Generic AttributesAttributeMap Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Associated Types

type Rep AttributesAttributeMap :: Type -> Type #

ToJSON AttributesAttributeMap Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

FromJSON AttributesAttributeMap Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep AttributesAttributeMap Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep AttributesAttributeMap = D1 (MetaData "AttributesAttributeMap" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" True) (C1 (MetaCons "AttributesAttributeMap'" PrefixI True) (S1 (MetaSel (Just "_aamAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text AttributeValue))))

attributesAttributeMap Source #

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

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

Annotation

data Annotation Source #

Text annotation with a set of attributes.

See: annotation smart constructor.

Instances
Eq Annotation Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Data Annotation Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

toConstr :: Annotation -> Constr #

dataTypeOf :: Annotation -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Annotation Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Generic Annotation Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Associated Types

type Rep Annotation :: Type -> Type #

ToJSON Annotation Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

FromJSON Annotation Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep Annotation Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep Annotation = D1 (MetaData "Annotation" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" False) (C1 (MetaCons "Annotation'" PrefixI True) (S1 (MetaSel (Just "_aAttributes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Attributes)) :*: S1 (MetaSel (Just "_aDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TruncatableString))))

annotation :: Annotation Source #

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

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

aAttributes :: Lens' Annotation (Maybe Attributes) Source #

A set of attributes on the annotation. You can have up to 4 attributes per Annotation.

aDescription :: Lens' Annotation (Maybe TruncatableString) Source #

A user-supplied message describing the event. The maximum length for the description is 256 bytes.

AttributeValue

data AttributeValue Source #

The allowed types for [VALUE] in a `[KEY]:[VALUE]` attribute.

See: attributeValue smart constructor.

Instances
Eq AttributeValue Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Data AttributeValue Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

toConstr :: AttributeValue -> Constr #

dataTypeOf :: AttributeValue -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AttributeValue Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Generic AttributeValue Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Associated Types

type Rep AttributeValue :: Type -> Type #

ToJSON AttributeValue Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

FromJSON AttributeValue Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep AttributeValue Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep AttributeValue = D1 (MetaData "AttributeValue" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" False) (C1 (MetaCons "AttributeValue'" PrefixI True) (S1 (MetaSel (Just "_avBoolValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_avIntValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_avStringValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TruncatableString)))))

attributeValue :: AttributeValue Source #

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

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

avBoolValue :: Lens' AttributeValue (Maybe Bool) Source #

A Boolean value represented by `true` or `false`.

avIntValue :: Lens' AttributeValue (Maybe Int64) Source #

A 64-bit signed integer.

avStringValue :: Lens' AttributeValue (Maybe TruncatableString) Source #

A string up to 256 bytes long.

MessageEvent

data MessageEvent Source #

An event describing a message sent/received between Spans.

See: messageEvent smart constructor.

Instances
Eq MessageEvent Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Data MessageEvent Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

toConstr :: MessageEvent -> Constr #

dataTypeOf :: MessageEvent -> DataType #

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

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

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

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

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

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

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

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

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

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

Show MessageEvent Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Generic MessageEvent Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Associated Types

type Rep MessageEvent :: Type -> Type #

ToJSON MessageEvent Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

FromJSON MessageEvent Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep MessageEvent Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep MessageEvent = D1 (MetaData "MessageEvent" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" False) (C1 (MetaCons "MessageEvent'" PrefixI True) ((S1 (MetaSel (Just "_meId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_meUncompressedSizeBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) :*: (S1 (MetaSel (Just "_meType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe MessageEventType)) :*: S1 (MetaSel (Just "_meCompressedSizeBytes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))))

messageEvent :: MessageEvent Source #

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

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

meId :: Lens' MessageEvent (Maybe Int64) Source #

An identifier for the MessageEvent's message that can be used to match SENT and RECEIVED MessageEvents. It is recommended to be unique within a Span.

meUncompressedSizeBytes :: Lens' MessageEvent (Maybe Int64) Source #

The number of uncompressed bytes sent or received.

meType :: Lens' MessageEvent (Maybe MessageEventType) Source #

Type of MessageEvent. Indicates whether the message was sent or received.

meCompressedSizeBytes :: Lens' MessageEvent (Maybe Int64) Source #

The number of compressed bytes sent or received. If missing assumed to be the same size as uncompressed.

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.CloudTrace.Types.Product

Methods

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

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

Data Empty Source # 
Instance details

Defined in Network.Google.CloudTrace.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.CloudTrace.Types.Product

Methods

showsPrec :: Int -> Empty -> ShowS #

show :: Empty -> String #

showList :: [Empty] -> ShowS #

Generic Empty Source # 
Instance details

Defined in Network.Google.CloudTrace.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.CloudTrace.Types.Product

FromJSON Empty Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep Empty Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep Empty = D1 (MetaData "Empty" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" 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.

Link

data Link Source #

A pointer from the current span to another span in the same trace or in a different trace. For example, this can be used in batching operations, where a single batch handler processes multiple requests from different traces or when the handler receives a request from a different project.

See: link smart constructor.

link :: Link Source #

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

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

lTraceId :: Lens' Link (Maybe Text) Source #

The [TRACE_ID] for a trace within a project.

lAttributes :: Lens' Link (Maybe Attributes) Source #

A set of attributes on the link. You have have up to 32 attributes per link.

lType :: Lens' Link (Maybe LinkType) Source #

The relationship of the current span relative to the linked span.

lSpanId :: Lens' Link (Maybe Text) Source #

The [SPAN_ID] for a span within a trace.

StatusDetailsItem

data StatusDetailsItem Source #

Instances
Eq StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Data StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

toConstr :: StatusDetailsItem -> Constr #

dataTypeOf :: StatusDetailsItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Generic StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Associated Types

type Rep StatusDetailsItem :: Type -> Type #

ToJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

FromJSON StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep StatusDetailsItem Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep StatusDetailsItem = D1 (MetaData "StatusDetailsItem" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" True) (C1 (MetaCons "StatusDetailsItem'" PrefixI True) (S1 (MetaSel (Just "_sdiAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text JSONValue))))

statusDetailsItem Source #

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

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

sdiAddtional :: Lens' StatusDetailsItem (HashMap Text JSONValue) Source #

Properties of the object. Contains field 'type with type URL.

StackTrace

data StackTrace Source #

A call stack appearing in a trace.

See: stackTrace smart constructor.

Instances
Eq StackTrace Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Data StackTrace Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

toConstr :: StackTrace -> Constr #

dataTypeOf :: StackTrace -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StackTrace Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Generic StackTrace Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Associated Types

type Rep StackTrace :: Type -> Type #

ToJSON StackTrace Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

FromJSON StackTrace Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep StackTrace Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep StackTrace = D1 (MetaData "StackTrace" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" False) (C1 (MetaCons "StackTrace'" PrefixI True) (S1 (MetaSel (Just "_stStackTraceHashId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))) :*: S1 (MetaSel (Just "_stStackFrames") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe StackFrames))))

stackTrace :: StackTrace Source #

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

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

stStackTraceHashId :: Lens' StackTrace (Maybe Int64) Source #

The hash ID is used to conserve network bandwidth for duplicate stack traces within a single trace. Often multiple spans will have identical stack traces. The first occurrence of a stack trace should contain both the `stackFrame` content and a value in `stackTraceHashId`. Subsequent spans within the same request can refer to that stack trace by only setting `stackTraceHashId`.

stStackFrames :: Lens' StackTrace (Maybe StackFrames) Source #

Stack frames in this stack trace. A maximum of 128 frames are allowed.

BatchWriteSpansRequest

data BatchWriteSpansRequest Source #

The request message for the `BatchWriteSpans` method.

See: batchWriteSpansRequest smart constructor.

Instances
Eq BatchWriteSpansRequest Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Data BatchWriteSpansRequest Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

toConstr :: BatchWriteSpansRequest -> Constr #

dataTypeOf :: BatchWriteSpansRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BatchWriteSpansRequest Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Generic BatchWriteSpansRequest Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Associated Types

type Rep BatchWriteSpansRequest :: Type -> Type #

ToJSON BatchWriteSpansRequest Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

FromJSON BatchWriteSpansRequest Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep BatchWriteSpansRequest Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep BatchWriteSpansRequest = D1 (MetaData "BatchWriteSpansRequest" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" True) (C1 (MetaCons "BatchWriteSpansRequest'" PrefixI True) (S1 (MetaSel (Just "_bwsrSpans") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Span]))))

batchWriteSpansRequest :: BatchWriteSpansRequest Source #

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

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

bwsrSpans :: Lens' BatchWriteSpansRequest [Span] Source #

A list of new spans. The span names must not match existing spans, or the results are undefined.

MessageEventType

data MessageEventType Source #

Type of MessageEvent. Indicates whether the message was sent or received.

Constructors

TypeUnspecified

TYPE_UNSPECIFIED Unknown event type.

Sent

SENT Indicates a sent message.

Received

RECEIVED Indicates a received message.

Instances
Enum MessageEventType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Eq MessageEventType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Data MessageEventType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Methods

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

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

toConstr :: MessageEventType -> Constr #

dataTypeOf :: MessageEventType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord MessageEventType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Read MessageEventType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Show MessageEventType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Generic MessageEventType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Associated Types

type Rep MessageEventType :: Type -> Type #

Hashable MessageEventType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

ToJSON MessageEventType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

FromJSON MessageEventType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

FromHttpApiData MessageEventType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

ToHttpApiData MessageEventType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

type Rep MessageEventType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

type Rep MessageEventType = D1 (MetaData "MessageEventType" "Network.Google.CloudTrace.Types.Sum" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" False) (C1 (MetaCons "TypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Sent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Received" PrefixI False) (U1 :: Type -> Type)))

Attributes

data Attributes Source #

A set of attributes, each in the format `[KEY]:[VALUE]`.

See: attributes smart constructor.

Instances
Eq Attributes Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Data Attributes Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

toConstr :: Attributes -> Constr #

dataTypeOf :: Attributes -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Attributes Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Generic Attributes Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Associated Types

type Rep Attributes :: Type -> Type #

ToJSON Attributes Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

FromJSON Attributes Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep Attributes Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep Attributes = D1 (MetaData "Attributes" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" False) (C1 (MetaCons "Attributes'" PrefixI True) (S1 (MetaSel (Just "_aDroppedAttributesCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_aAttributeMap") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AttributesAttributeMap))))

attributes :: Attributes Source #

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

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

aDroppedAttributesCount :: Lens' Attributes (Maybe Int32) Source #

The number of attributes that were discarded. Attributes can be discarded because their keys are too long or because there are too many attributes. If this value is 0 then all attributes are valid.

aAttributeMap :: Lens' Attributes (Maybe AttributesAttributeMap) Source #

The set of attributes. Each attribute's key can be up to 128 bytes long. The value can be a string up to 256 bytes, a signed 64-bit integer, or the Boolean values `true` and `false`. For example: "/instance_id": "my-instance" "/http/user_agent": "" "/http/request_bytes": 300 "abc.com/myattribute": true

Module

data Module Source #

Binary module.

See: module' smart constructor.

Instances
Eq Module Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

Data Module Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

toConstr :: Module -> Constr #

dataTypeOf :: Module -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Module Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Generic Module Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Associated Types

type Rep Module :: Type -> Type #

Methods

from :: Module -> Rep Module x #

to :: Rep Module x -> Module #

ToJSON Module Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

FromJSON Module Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep Module Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep Module = D1 (MetaData "Module" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" False) (C1 (MetaCons "Module'" PrefixI True) (S1 (MetaSel (Just "_mBuildId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TruncatableString)) :*: S1 (MetaSel (Just "_mModule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TruncatableString))))

module' :: Module Source #

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

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

mBuildId :: Lens' Module (Maybe TruncatableString) Source #

A unique identifier for the module, usually a hash of its contents (up to 128 bytes).

mModule :: Lens' Module (Maybe TruncatableString) Source #

For example: main binary, kernel modules, and dynamic libraries such as libc.so, sharedlib.so (up to 256 bytes).

TimeEvents

data TimeEvents Source #

A collection of `TimeEvent`s. A `TimeEvent` is a time-stamped annotation on the span, consisting of either user-supplied key:value pairs, or details of a message sent/received between Spans.

See: timeEvents smart constructor.

Instances
Eq TimeEvents Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Data TimeEvents Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

toConstr :: TimeEvents -> Constr #

dataTypeOf :: TimeEvents -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TimeEvents Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Generic TimeEvents Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Associated Types

type Rep TimeEvents :: Type -> Type #

ToJSON TimeEvents Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

FromJSON TimeEvents Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep TimeEvents Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep TimeEvents = D1 (MetaData "TimeEvents" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" False) (C1 (MetaCons "TimeEvents'" PrefixI True) (S1 (MetaSel (Just "_teDroppedMessageEventsCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_teDroppedAnnotationsCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_teTimeEvent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [TimeEvent])))))

timeEvents :: TimeEvents Source #

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

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

teDroppedMessageEventsCount :: Lens' TimeEvents (Maybe Int32) Source #

The number of dropped message events in all the included time events. If the value is 0, then no message events were dropped.

teDroppedAnnotationsCount :: Lens' TimeEvents (Maybe Int32) Source #

The number of dropped annotations in all the included time events. If the value is 0, then no annotations were dropped.

teTimeEvent :: Lens' TimeEvents [TimeEvent] Source #

A collection of `TimeEvent`s.

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

Eq Xgafv Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Methods

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

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

Data Xgafv Source # 
Instance details

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

Show Xgafv Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

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

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.CloudTrace.Types.Sum" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" False) (C1 (MetaCons "X1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "X2" PrefixI False) (U1 :: Type -> Type))

StackFrames

data StackFrames Source #

A collection of stack frames, which can be truncated.

See: stackFrames smart constructor.

Instances
Eq StackFrames Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Data StackFrames Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

toConstr :: StackFrames -> Constr #

dataTypeOf :: StackFrames -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StackFrames Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Generic StackFrames Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Associated Types

type Rep StackFrames :: Type -> Type #

ToJSON StackFrames Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

FromJSON StackFrames Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep StackFrames Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep StackFrames = D1 (MetaData "StackFrames" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" False) (C1 (MetaCons "StackFrames'" PrefixI True) (S1 (MetaSel (Just "_sfDroppedFramesCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_sfFrame") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [StackFrame]))))

stackFrames :: StackFrames Source #

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

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

sfDroppedFramesCount :: Lens' StackFrames (Maybe Int32) Source #

The number of stack frames that were dropped because there were too many stack frames. If this value is 0, then no stack frames were dropped.

sfFrame :: Lens' StackFrames [StackFrame] Source #

Stack frames in this call stack.

LinkType

data LinkType Source #

The relationship of the current span relative to the linked span.

Constructors

LTTypeUnspecified

TYPE_UNSPECIFIED The relationship of the two spans is unknown.

LTChildLinkedSpan

CHILD_LINKED_SPAN The linked span is a child of the current span.

LTParentLinkedSpan

PARENT_LINKED_SPAN The linked span is a parent of the current span.

Instances
Enum LinkType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Eq LinkType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Data LinkType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Methods

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

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

toConstr :: LinkType -> Constr #

dataTypeOf :: LinkType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord LinkType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Read LinkType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Show LinkType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Generic LinkType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Associated Types

type Rep LinkType :: Type -> Type #

Methods

from :: LinkType -> Rep LinkType x #

to :: Rep LinkType x -> LinkType #

Hashable LinkType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

Methods

hashWithSalt :: Int -> LinkType -> Int #

hash :: LinkType -> Int #

ToJSON LinkType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

FromJSON LinkType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

FromHttpApiData LinkType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

ToHttpApiData LinkType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

type Rep LinkType Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Sum

type Rep LinkType = D1 (MetaData "LinkType" "Network.Google.CloudTrace.Types.Sum" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" False) (C1 (MetaCons "LTTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "LTChildLinkedSpan" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "LTParentLinkedSpan" PrefixI False) (U1 :: Type -> Type)))

StackFrame

data StackFrame Source #

Represents a single stack frame in a stack trace.

See: stackFrame smart constructor.

Instances
Eq StackFrame Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Data StackFrame Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

toConstr :: StackFrame -> Constr #

dataTypeOf :: StackFrame -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StackFrame Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Generic StackFrame Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Associated Types

type Rep StackFrame :: Type -> Type #

ToJSON StackFrame Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

FromJSON StackFrame Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep StackFrame Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

stackFrame :: StackFrame Source #

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

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

sfLoadModule :: Lens' StackFrame (Maybe Module) Source #

The binary module from where the code was loaded.

sfOriginalFunctionName :: Lens' StackFrame (Maybe TruncatableString) Source #

An un-mangled function name, if `function_name` is mangled. The name can be fully-qualified (up to 1024 bytes).

sfLineNumber :: Lens' StackFrame (Maybe Int64) Source #

The line number in `file_name` where the function call appears.

sfSourceVersion :: Lens' StackFrame (Maybe TruncatableString) Source #

The version of the deployed source code (up to 128 bytes).

sfFunctionName :: Lens' StackFrame (Maybe TruncatableString) Source #

The fully-qualified name that uniquely identifies the function or method that is active in this frame (up to 1024 bytes).

sfColumnNumber :: Lens' StackFrame (Maybe Int64) Source #

The column number where the function call appears, if available. This is important in JavaScript because of its anonymous functions.

sfFileName :: Lens' StackFrame (Maybe TruncatableString) Source #

The name of the source file where the function call appears (up to 256 bytes).

Links

data Links Source #

A collection of links, which are references from this span to a span in the same or different trace.

See: links smart constructor.

links :: Links Source #

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

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

lDroppedLinksCount :: Lens' Links (Maybe Int32) Source #

The number of dropped links after the maximum size was enforced. If this value is 0, then no links were dropped.

lLink :: Lens' Links [Link] Source #

A collection of links.

TimeEvent

data TimeEvent Source #

A time-stamped annotation or message event in the Span.

See: timeEvent smart constructor.

Instances
Eq TimeEvent Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Data TimeEvent Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Methods

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

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

toConstr :: TimeEvent -> Constr #

dataTypeOf :: TimeEvent -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TimeEvent Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Generic TimeEvent Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

Associated Types

type Rep TimeEvent :: Type -> Type #

ToJSON TimeEvent Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

FromJSON TimeEvent Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep TimeEvent Source # 
Instance details

Defined in Network.Google.CloudTrace.Types.Product

type Rep TimeEvent = D1 (MetaData "TimeEvent" "Network.Google.CloudTrace.Types.Product" "gogol-cloudtrace-0.4.0-1Tc48PF6dD833eHT0bt1hA" False) (C1 (MetaCons "TimeEvent'" PrefixI True) (S1 (MetaSel (Just "_teMessageEvent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe MessageEvent)) :*: (S1 (MetaSel (Just "_teAnnotation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Annotation)) :*: S1 (MetaSel (Just "_teTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')))))

timeEvent :: TimeEvent Source #

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

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

teMessageEvent :: Lens' TimeEvent (Maybe MessageEvent) Source #

An event describing a message sent/received between Spans.

teAnnotation :: Lens' TimeEvent (Maybe Annotation) Source #

Text annotation with a set of attributes.

teTime :: Lens' TimeEvent (Maybe UTCTime) Source #

The timestamp indicating the time the event occurred.