测试

当您依赖OpenTelemetry进行您的可观测性需求时,测试某些 span 是否正确创建并正确设置属性非常重要。例如,您是否确保将正确的元数据附加到最终用于支撑 SLO 的数据上?本文档介绍了一种验证的方法。

设置

在 Elixir/Erlang 中进行测试仅需要 opentelemetryopentelemetry_api 库:

{deps, [{opentelemetry_api, "~> 1.2"},
        {opentelemetry, "~> 1.3"}]}.
def deps do
  [
    {:opentelemetry_api, "~> 1.2"},
    {:opentelemetry, "~> 1.3"}
  ]
end

将您的 exporter 设置为 :none,将 span 处理器设置为 :otel_simple_processor。这样可以确保在处理完 span 后,测试不会实际导出数据并能进行分析。

%% config/sys.config.src
{opentelemetry,
  [{traces_exporter, none},
   {processors,
     [{otel_simple_processor, #{}}]}]}
# config/test.exs
import Config

config :opentelemetry,
    traces_exporter: :none

config :opentelemetry, :processors, [
  {:otel_simple_processor, %{}}
]

入门指南中修改的 hello 函数将作为我们的测试用例:

%% apps/otel_getting_started/src/otel_getting_started.erl
-module(otel_getting_started).

-export([hello/0]).

-include_lib("opentelemetry_api/include/otel_tracer.hrl").

hello() ->
    %% 启动一个活动的 span 并运行一个本地函数
    ?with_span(<<"operation">>, #{}, fun nice_operation/1).

nice_operation(_SpanCtx) ->
    ?set_attributes([{a_key, <<"a value">>}]),
    world
# lib/otel_getting_started.ex
defmodule OtelGettingStarted do
  require OpenTelemetry.Tracer, as: Tracer

  def hello do
    Tracer.with_span "operation" do
      Tracer.set_attributes([{:a_key, "a value"}])
      :world
    end
  end
end

测试

-module(otel_getting_started_SUITE).

-compile(export_all).

-include_lib("stdlib/include/assert.hrl").
-include_lib("common_test/include/ct.hrl").

-include_lib("opentelemetry/include/otel_span.hrl").

-define(assertReceive(SpanName),
        receive
            {span, Span=#span{name=SpanName}} ->
                Span
        after
            1000 ->
                ct:fail("1秒后没有收到 span")
        end).

all() ->
    [greets_the_world].

init_per_suite(Config) ->
    application:load(opentelemetry),
    application:set_env(opentelemetry, processors, [{otel_simple_processor, #{}}]),
    {ok, _} = application:ensure_all_started(opentelemetry),
    Config.

end_per_suite(_Config) ->
    _ = application:stop(opentelemetry),
    _ = application:unload(opentelemetry),
    ok.

init_per_testcase(greets_the_world, Config) ->
    otel_simple_processor:set_exporter(otel_exporter_pid, self()),
    Config.

end_per_testcase(greets_the_world, _Config) ->
    otel_simple_processor:set_exporter(none),
    ok.

greets_the_world(_Config) ->
    otel_getting_started:hello(),

    ExpectedAttributes = otel_attributes:new(#{a_key => <<"a_value">>}, 128, infinity),
    #span{attributes=ReceivedAttributes} = ?assertReceive(<<"operation">>),

    %% 使用 assertMatch 来匹配 `receive` 语句中的 span,
    %% 这样可以获得出错信息
    ?assertMatch(ReceivedAttributes, ExpectedAttributes),

    ok.
defmodule OtelGettingStartedTest do
  use ExUnit.Case

  # 使用 Record 模块从 opentelemetry 依赖中提取 Span 记录的字段。
  require Record
  @fields Record.extract(:span, from: "deps/opentelemetry/include/otel_span.hrl")
  # 定义 `Span` 的宏。
  Record.defrecordp(:span, @fields)

  test "greets the world" do
    # 将 exporter 设置为 :otel_exporter_pid,该 exporter 会以 {:span, span} 的格式将 span 发送给指定进程,这里是 self()。
    :otel_simple_processor.set_exporter(:otel_exporter_pid, self())

    # 调用要测试的函数。
    OtelGettingStarted.hello()

    # 使用 Erlang 的 `:otel_attributes` 模块创建要匹配的属性。
    # 有关测试事件,请参考 `:otel_events` 模块。
    attributes = :otel_attributes.new([a_key: "a value"], 128, :infinity)

    # 断言由 OtelGettingStarted.hello/0 发出的 span 是否已接收并包含所需属性。
    assert_receive {:span,
                    span(
                      name: "operation",
                      attributes: ^attributes
                    )}
  end
end
最后修改 December 10, 2023: translate (a4350d6e)