Skip to content

Commit

Permalink
fix style
Browse files Browse the repository at this point in the history
  • Loading branch information
develop7 committed Feb 13, 2024
1 parent d22baf4 commit 0830a45
Showing 1 changed file with 0 additions and 3 deletions.
3 changes: 0 additions & 3 deletions src/PostgREST/OpenTelemetry.hs
Original file line number Diff line number Diff line change
@@ -1,5 +1,3 @@
{-# LANGUAGE OverloadedLists #-}
{-# LANGUAGE ScopedTypeVariables #-}
module PostgREST.OpenTelemetry (withTracer) where

import OpenTelemetry.Trace (InstrumentationLibrary (..), Tracer,
Expand All @@ -9,7 +7,6 @@ import OpenTelemetry.Trace (InstrumentationLibrary (..), Tracer,
import PostgREST.Version (prettyVersion)
import Protolude


withTracer :: Text -> (Tracer -> IO c) -> IO c
withTracer label f = bracket
initializeGlobalTracerProvider
Expand Down

0 comments on commit 0830a45

Please sign in to comment.