Skip to content

Commit d06b8c2

Browse files
committed
Add span kinds
1 parent 26dc02b commit d06b8c2

File tree

2 files changed

+2
-2
lines changed

2 files changed

+2
-2
lines changed

R/daemon.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -221,7 +221,7 @@ eval_mirai <- function(._mirai_.) {
221221
spn <- otel::start_local_active_span(
222222
"mirai::daemon->eval",
223223
links = list(daemon = dmn_spn),
224-
options = list(parent = prtctx)
224+
options = list(kind = "server", parent = prtctx)
225225
)
226226
dmn_spn$add_event("eval start", attributes = list(span.id = spn$get_context()$get_span_id()))
227227
}

R/mirai.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -169,7 +169,7 @@ mirai <- function(.expr, ..., .args = list(), .timeout = NULL, .compute = NULL)
169169
spn <- otel::start_local_active_span(
170170
"mirai::mirai",
171171
links = if (active) list(compute_profile = envir[["otel_span"]]),
172-
options = if (!active) list(parent = envir[["otel_span"]])
172+
options = list(kind = "client", parent = if (!active) envir[["otel_span"]])
173173
)
174174
otel::pack_http_context()
175175
}

0 commit comments

Comments
 (0)