Skip to content

Commit bc07988

Browse files
committed
Update to opentelemetry-0.4.0
1 parent 33d0356 commit bc07988

File tree

15 files changed

+52
-52
lines changed

15 files changed

+52
-52
lines changed

src/Stack/Build.hs

Lines changed: 6 additions & 6 deletions
Original file line numberDiff line numberDiff line change
@@ -57,7 +57,7 @@ import OpenTelemetry.Eventlog
5757
build :: HasEnvConfig env
5858
=> Maybe (Set (Path Abs File) -> IO ()) -- ^ callback after discovering all local files
5959
-> RIO env ()
60-
build msetLocalFiles = withSpan "Build.build" $ do
60+
build msetLocalFiles = withSpan_ "Build.build" $ do
6161
mcp <- view $ configL.to configModifyCodePage
6262
ghcVersion <- view $ actualCompilerVersionL.to getGhcVersion
6363
fixCodePage mcp ghcVersion $ do
@@ -70,7 +70,7 @@ build msetLocalFiles = withSpan "Build.build" $ do
7070
checkSubLibraryDependencies (Map.elems $ smProject sourceMap)
7171

7272
boptsCli <- view $ envConfigL.to envConfigBuildOptsCLI
73-
withSpan "Build.build_setLocalFiles" $ do
73+
withSpan_ "Build.build_setLocalFiles" $ do
7474
-- Set local files, necessary for file watching
7575
stackYaml <- view stackYamlL
7676
for_ msetLocalFiles $ \setLocalFiles -> do
@@ -88,10 +88,10 @@ build msetLocalFiles = withSpan "Build.build" $ do
8888
lpFilesForComponents components lp
8989
liftIO $ setLocalFiles $ Set.insert stackYaml $ Set.unions files
9090

91-
withSpan "Build.build_checkComponentsBuildable" $ do
91+
withSpan_ "Build.build_checkComponentsBuildable" $ do
9292
checkComponentsBuildable allLocals
9393

94-
installMap <- withSpan "Build.Installed.toInstallMap" $ toInstallMap sourceMap
94+
installMap <- withSpan_ "Build.Installed.toInstallMap" $ toInstallMap sourceMap
9595
(installedMap, globalDumpPkgs, snapshotDumpPkgs, localDumpPkgs) <-
9696
getInstalled installMap
9797

@@ -238,7 +238,7 @@ splitObjsWarning = unwords
238238
-- | Get the @BaseConfigOpts@ necessary for constructing configure options
239239
mkBaseConfigOpts :: (HasEnvConfig env)
240240
=> BuildOptsCLI -> RIO env BaseConfigOpts
241-
mkBaseConfigOpts boptsCli = withSpan "Build.mkBaseConfigOpts" $ do
241+
mkBaseConfigOpts boptsCli = withSpan_ "Build.mkBaseConfigOpts" $ do
242242
bopts <- view buildOptsL
243243
snapDBPath <- packageDatabaseDeps
244244
localDBPath <- packageDatabaseLocal
@@ -263,7 +263,7 @@ loadPackage
263263
-> [Text] -- ^ GHC options
264264
-> [Text] -- ^ Cabal configure options
265265
-> RIO env Package
266-
loadPackage loc flags ghcOptions cabalConfigOpts = withSpan "Build.loadPackage" $ do
266+
loadPackage loc flags ghcOptions cabalConfigOpts = withSpan_ "Build.loadPackage" $ do
267267
compiler <- view actualCompilerVersionL
268268
platform <- view platformL
269269
let pkgConfig = PackageConfig

src/Stack/Build/ConstructPlan.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -175,7 +175,7 @@ constructPlan :: forall env. HasEnvConfig env
175175
-> InstalledMap
176176
-> Bool
177177
-> RIO env Plan
178-
constructPlan baseConfigOpts0 localDumpPkgs loadPackage0 sourceMap installedMap initialBuildSteps = withSpan "Build.ConstructPlan.constructPlan" $ do
178+
constructPlan baseConfigOpts0 localDumpPkgs loadPackage0 sourceMap installedMap initialBuildSteps = withSpan_ "Build.ConstructPlan.constructPlan" $ do
179179
logDebug "Constructing the build plan"
180180

181181
when hasBaseInDeps $

src/Stack/Build/Execute.hs

Lines changed: 8 additions & 8 deletions
Original file line numberDiff line numberDiff line change
@@ -249,7 +249,7 @@ getSetupExe :: HasEnvConfig env
249249
-> Path Abs File -- ^ SetupShim.hs input file
250250
-> Path Abs Dir -- ^ temporary directory
251251
-> RIO env (Maybe (Path Abs File))
252-
getSetupExe setupHs setupShimHs tmpdir = withSpan "Build.Execute.getSetupExe" $ do
252+
getSetupExe setupHs setupShimHs tmpdir = withSpan_ "Build.Execute.getSetupExe" $ do
253253
wc <- view $ actualCompilerVersionL.whichCompilerL
254254
platformDir <- platformGhcRelDir
255255
config <- view configL
@@ -482,7 +482,7 @@ executePlan :: HasEnvConfig env
482482
-> Map PackageName Target
483483
-> Plan
484484
-> RIO env ()
485-
executePlan boptsCli baseConfigOpts locals globalPackages snapshotPackages localPackages installedMap targets plan = withSpan "Build.Execute.executePlan" $ do
485+
executePlan boptsCli baseConfigOpts locals globalPackages snapshotPackages localPackages installedMap targets plan = withSpan_ "Build.Execute.executePlan" $ do
486486
logDebug "Executing the build plan"
487487
bopts <- view buildOptsL
488488
withExecuteEnv bopts boptsCli baseConfigOpts locals globalPackages snapshotPackages localPackages mlargestPackageName
@@ -512,7 +512,7 @@ copyExecutables
512512
=> Map Text InstallLocation
513513
-> RIO env ()
514514
copyExecutables exes | Map.null exes = return ()
515-
copyExecutables exes = withSpan "Build.Execute.copyExecutables" $ do
515+
copyExecutables exes = withSpan_ "Build.Execute.copyExecutables" $ do
516516
snapBin <- (</> bindirSuffix) `liftM` installationRootDeps
517517
localBin <- (</> bindirSuffix) `liftM` installationRootLocal
518518
compilerSpecific <- boptsInstallCompilerTool <$> view buildOptsL
@@ -671,7 +671,7 @@ unregisterPackages ::
671671
-> Path Abs Dir
672672
-> NonEmpty (GhcPkgId, (PackageIdentifier, Text))
673673
-> RIO env ()
674-
unregisterPackages cv localDB ids = withSpan "Build.Execute.unregisterPackages" $ do
674+
unregisterPackages cv localDB ids = withSpan_ "Build.Execute.unregisterPackages" $ do
675675
let logReason ident reason =
676676
logInfo $
677677
fromString (packageIdentifierString ident) <> ": unregistering" <>
@@ -846,7 +846,7 @@ ensureConfig :: HasEnvConfig env
846846
-> Path Abs File -- ^ .cabal file
847847
-> Task
848848
-> RIO env Bool
849-
ensureConfig newConfigCache pkgDir ExecuteEnv {..} announce cabal cabalfp task = withSpan "Build.Execute.ensureConfig" $ do
849+
ensureConfig newConfigCache pkgDir ExecuteEnv {..} announce cabal cabalfp task = withSpan_ "Build.Execute.ensureConfig" $ do
850850
newCabalMod <- liftIO $ modificationTime <$> getFileStatus (toFilePath cabalfp)
851851
setupConfigfp <- setupConfigFromDir pkgDir
852852
newSetupConfigMod <- liftIO $ either (const Nothing) (Just . modificationTime) <$>
@@ -1131,7 +1131,7 @@ withSingleContext ActionContext {..} ee@ExecuteEnv {..} task@Task {..} mdeps msu
11311131
-> OutputType
11321132
-> ((KeepOutputOpen -> ExcludeTHLoading -> [String] -> RIO env ()) -> RIO env a)
11331133
-> RIO env a
1134-
withCabal package pkgDir outputType inner = withSpan "Build.Execute.withCabal" $ do
1134+
withCabal package pkgDir outputType inner = withSpan_ "Build.Execute.withCabal" $ do
11351135
config <- view configL
11361136
unless (configAllowDifferentUser config) $
11371137
checkOwnership (pkgDir </> configWorkDir config)
@@ -1480,7 +1480,7 @@ singleBuild ac@ActionContext {..} ee@ExecuteEnv {..} task@Task {..} installedMap
14801480
return $ if b then Just pc else Nothing
14811481
_ -> return Nothing
14821482

1483-
copyPreCompiled (PrecompiledCache mlib sublibs exes) = withSpan "Build.Execute.copyPreCompiled" $ do
1483+
copyPreCompiled (PrecompiledCache mlib sublibs exes) = withSpan_ "Build.Execute.copyPreCompiled" $ do
14841484
wc <- view $ actualCompilerVersionL.whichCompilerL
14851485
announceTask ee task "using precompiled package"
14861486

@@ -1588,7 +1588,7 @@ singleBuild ac@ActionContext {..} ee@ExecuteEnv {..} task@Task {..} installedMap
15881588
-> (Utf8Builder -> RIO env ())
15891589
-> Map Text ExecutableBuildStatus
15901590
-> RIO env Installed
1591-
realBuild cache package pkgDir cabal0 announce executableBuildStatuses = withSpan "Build.Execute.realBuild" $ do
1591+
realBuild cache package pkgDir cabal0 announce executableBuildStatuses = withSpan_ "Build.Execute.realBuild" $ do
15921592
let cabal = cabal0 CloseOnException
15931593
wc <- view $ actualCompilerVersionL.whichCompilerL
15941594

src/Stack/Build/Installed.hs

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -55,7 +55,7 @@ getInstalled :: HasEnvConfig env
5555
, [DumpPackage] -- snapshot installed
5656
, [DumpPackage] -- locally installed
5757
)
58-
getInstalled {-opts-} installMap = withSpan "Build.Installed.getInstalled" $ do
58+
getInstalled {-opts-} installMap = withSpan_ "Build.Installed.getInstalled" $ do
5959
logDebug "Finding out which packages are already installed"
6060
snapDBPath <- packageDatabaseDeps
6161
localDBPath <- packageDatabaseLocal
@@ -116,7 +116,7 @@ loadDatabase :: HasEnvConfig env
116116
-> Maybe (InstalledPackageLocation, Path Abs Dir) -- ^ package database, Nothing for global
117117
-> [LoadHelper] -- ^ from parent databases
118118
-> RIO env ([LoadHelper], [DumpPackage])
119-
loadDatabase installMap mdb lhs0 = withSpan "Build.Installed.loadDatabase" $ do
119+
loadDatabase installMap mdb lhs0 = withSpan_ "Build.Installed.loadDatabase" $ do
120120
pkgexe <- getGhcPkgExe
121121
(lhs1', dps) <- ghcPkgDump pkgexe (fmap snd (maybeToList mdb))
122122
$ conduitDumpPackage .| sink

src/Stack/Build/Source.hs

Lines changed: 5 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -48,13 +48,13 @@ import OpenTelemetry.Eventlog
4848
-- | loads and returns project packages
4949
projectLocalPackages :: HasEnvConfig env
5050
=> RIO env [LocalPackage]
51-
projectLocalPackages = withSpan "Build.Source.projectLocalPackages" $ do
51+
projectLocalPackages = withSpan_ "Build.Source.projectLocalPackages" $ do
5252
sm <- view $ envConfigL.to envConfigSourceMap
5353
for (toList $ smProject sm) loadLocalPackage
5454

5555
-- | loads all local dependencies - project packages and local extra-deps
5656
localDependencies :: HasEnvConfig env => RIO env [LocalPackage]
57-
localDependencies = withSpan "Build.Source.localDependencies" $ do
57+
localDependencies = withSpan_ "Build.Source.localDependencies" $ do
5858
bopts <- view $ configL.to configBuild
5959
sourceMap <- view $ envConfigL . to envConfigSourceMap
6060
forMaybeM (Map.elems $ smDeps sourceMap) $ \dp ->
@@ -71,7 +71,7 @@ loadSourceMap :: HasBuildConfig env
7171
-> BuildOptsCLI
7272
-> SMActual DumpedGlobalPackage
7373
-> RIO env SourceMap
74-
loadSourceMap smt boptsCli sma = withSpan "Build.Source.loadSourceMap" $ do
74+
loadSourceMap smt boptsCli sma = withSpan_ "Build.Source.loadSourceMap" $ do
7575
bconfig <- view buildConfigL
7676
let compiler = smaCompiler sma
7777
project = M.map applyOptsFlagsPP $ smaProject sma
@@ -252,7 +252,7 @@ loadCommonPackage ::
252252
forall env. (HasBuildConfig env, HasSourceMap env)
253253
=> CommonPackage
254254
-> RIO env Package
255-
loadCommonPackage common = withSpan "Build.Source.loadCommonPackage" $ do
255+
loadCommonPackage common = withSpan_ "Build.Source.loadCommonPackage" $ do
256256
config <- getPackageConfig (cpFlags common) (cpGhcOptions common) (cpCabalConfigOpts common)
257257
gpkg <- liftIO $ cpGPD common
258258
return $ resolvePackage config gpkg
@@ -263,7 +263,7 @@ loadLocalPackage ::
263263
forall env. (HasBuildConfig env, HasSourceMap env)
264264
=> ProjectPackage
265265
-> RIO env LocalPackage
266-
loadLocalPackage pp = withSpan "Build.Source.loadLocalPackage" $ do
266+
loadLocalPackage pp = withSpan_ "Build.Source.loadLocalPackage" $ do
267267
sm <- view sourceMapL
268268
let common = ppCommon pp
269269
bopts <- view buildOptsL

src/Stack/Config.hs

Lines changed: 5 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -147,7 +147,7 @@ makeConcreteResolver
147147
=> AbstractResolver
148148
-> RIO env RawSnapshotLocation
149149
makeConcreteResolver (ARResolver r) = pure r
150-
makeConcreteResolver ar = withSpan "Config.makeConcreteResolver" $ do
150+
makeConcreteResolver ar = withSpan_ "Config.makeConcreteResolver" $ do
151151
r <-
152152
case ar of
153153
ARResolver r -> assert False $ makeConcreteResolver (ARResolver r)
@@ -436,7 +436,7 @@ getDefaultLocalProgramsBase configStackRoot configPlatform override =
436436
-- | Load the configuration, using current directory, environment variables,
437437
-- and defaults as necessary.
438438
loadConfig :: HasRunner env => (Config -> RIO env a) -> RIO env a
439-
loadConfig inner = withSpan "Config.loadConfig" $ do
439+
loadConfig inner = withSpan_ "Config.loadConfig" $ do
440440
mstackYaml <- view $ globalOptsL.to globalStackYaml
441441
mproject <- loadProjectConfig mstackYaml
442442
mresolver <- view $ globalOptsL.to globalResolver
@@ -482,7 +482,7 @@ loadConfig inner = withSpan "Config.loadConfig" $ do
482482
withBuildConfig
483483
:: RIO BuildConfig a
484484
-> RIO Config a
485-
withBuildConfig inner = withSpan "Config.withBuildConfig" $ do
485+
withBuildConfig inner = withSpan_ "Config.withBuildConfig" $ do
486486
config <- ask
487487

488488
-- If provided, turn the AbstractResolver from the command line
@@ -798,7 +798,7 @@ getExtraConfigs userConfigPath = do
798798
loadConfigYaml
799799
:: HasLogFunc env
800800
=> (Value -> Yaml.Parser (WithJSONWarnings a)) -> Path Abs File -> RIO env a
801-
loadConfigYaml parser path = withSpan "Config.loadConfigYaml" $ do
801+
loadConfigYaml parser path = withSpan_ "Config.loadConfigYaml" $ do
802802
eres <- loadYaml parser path
803803
case eres of
804804
Left err -> liftIO $ throwM (ParseConfigFileException path err)
@@ -853,7 +853,7 @@ loadProjectConfig :: HasLogFunc env
853853
=> StackYamlLoc
854854
-- ^ Override stack.yaml
855855
-> RIO env (ProjectConfig (Project, Path Abs File, ConfigMonoid))
856-
loadProjectConfig mstackYaml = withSpan "Config.loadProjectConfig" $ do
856+
loadProjectConfig mstackYaml = withSpan_ "Config.loadProjectConfig" $ do
857857
mfp <- getProjectConfig mstackYaml
858858
case mfp of
859859
PCProject fp -> do

src/Stack/Lock.hs

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -79,7 +79,7 @@ instance FromJSON (WithJSONWarnings (Unresolved Locked)) where
7979
loadYamlThrow
8080
:: HasLogFunc env
8181
=> (Value -> Yaml.Parser (WithJSONWarnings a)) -> Path Abs File -> RIO env a
82-
loadYamlThrow parser path = withSpan "Lock.loadYamlThrow" $ do
82+
loadYamlThrow parser path = withSpan_ "Lock.loadYamlThrow" $ do
8383
val <- liftIO $ Yaml.decodeFileThrow (toFilePath path)
8484
case Yaml.parseEither parser val of
8585
Left err -> throwIO $ Yaml.AesonException err
@@ -96,7 +96,7 @@ lockCachedWanted ::
9696
-> Map PackageName (Bool -> RIO env DepPackage)
9797
-> RIO env ( SMWanted, [CompletedPLI]))
9898
-> RIO env SMWanted
99-
lockCachedWanted stackFile resolver fillWanted = withSpan "Lock.lockCacheWanted" $ do
99+
lockCachedWanted stackFile resolver fillWanted = withSpan_ "Lock.lockCacheWanted" $ do
100100
lockFile <- liftIO $ addExtension ".lock" stackFile
101101
let getLockExists = doesFileExist lockFile
102102
lfb <- view lockFileBehaviorL
@@ -120,7 +120,7 @@ lockCachedWanted stackFile resolver fillWanted = withSpan "Lock.lockCacheWanted"
120120
slocCache = toMap $ lckSnapshotLocations locked
121121
pkgLocCache = toMap $ lckPkgImmutableLocations locked
122122
(snap, slocCompleted, pliCompleted) <-
123-
withSpan "Pantry.loadAndCompleteSnapshotRaw" $ loadAndCompleteSnapshotRaw resolver slocCache pkgLocCache
123+
withSpan_ "Pantry.loadAndCompleteSnapshotRaw" $ loadAndCompleteSnapshotRaw resolver slocCache pkgLocCache
124124
let compiler = snapshotCompiler snap
125125
snPkgs = Map.mapWithKey (\n p h -> snapToDepPackage h n p) (snapshotPackages snap)
126126
(wanted, prjCompleted) <- fillWanted pkgLocCache compiler snPkgs

src/Stack/PackageDump.hs

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -61,9 +61,9 @@ ghcPkgCmdArgs
6161
-> [Path Abs Dir] -- ^ if empty, use global
6262
-> ConduitM Text Void (RIO env) a
6363
-> RIO env a
64-
ghcPkgCmdArgs pkgexe@(GhcPkgExe pkgPath) cmd mpkgDbs sink = withSpan "PackageDump.ghcPkgCmdArgs" $ do
65-
setTag "args" $ fromString (unwords cmd)
66-
setTag "dbs" $ fromString (show mpkgDbs)
64+
ghcPkgCmdArgs pkgexe@(GhcPkgExe pkgPath) cmd mpkgDbs sink = withSpan "PackageDump.ghcPkgCmdArgs" $ \sp -> do
65+
setTag sp "args" $ fromString (unwords cmd)
66+
setTag sp "dbs" $ fromString (show mpkgDbs)
6767
case reverse mpkgDbs of
6868
(pkgDb:_) -> createDatabase pkgexe pkgDb -- TODO maybe use some retry logic instead?
6969
_ -> return ()

src/Stack/Prelude.hs

Lines changed: 9 additions & 9 deletions
Original file line numberDiff line numberDiff line change
@@ -68,9 +68,9 @@ sinkProcessStderrStdout
6868
-> ConduitM ByteString Void (RIO env) e -- ^ Sink for stderr
6969
-> ConduitM ByteString Void (RIO env) o -- ^ Sink for stdout
7070
-> RIO env (e,o)
71-
sinkProcessStderrStdout name args sinkStderr sinkStdout = withSpan "sinkProcessStderrStdout" $ do
72-
setTag "process" (fromString name)
73-
setTag "args" $ fromString (show args)
71+
sinkProcessStderrStdout name args sinkStderr sinkStdout = withSpan "sinkProcessStderrStdout" $ \sp -> do
72+
setTag sp "process" (fromString name)
73+
setTag sp "args" $ fromString (show args)
7474
proc name args $ \pc0 -> do
7575
let pc = setStdout createSource
7676
$ setStderr createSource
@@ -94,9 +94,9 @@ sinkProcessStdout
9494
-> [String] -- ^ Command line arguments
9595
-> ConduitM ByteString Void (RIO env) a -- ^ Sink for stdout
9696
-> RIO env a
97-
sinkProcessStdout name args sinkStdout = withSpan "sinkProcessStdout" $ do
98-
setTag "process" (fromString name)
99-
setTag "args" $ fromString (show args)
97+
sinkProcessStdout name args sinkStdout = withSpan "sinkProcessStdout" $ \sp -> do
98+
setTag sp "process" (fromString name)
99+
setTag sp "args" $ fromString (show args)
100100
proc name args $ \pc ->
101101
withLoggedProcess_ (setStdin closed pc) $ \p -> runConcurrently
102102
$ Concurrently (runConduit $ getStderr p .| CL.sinkNull)
@@ -106,7 +106,7 @@ logProcessStderrStdout
106106
:: (HasCallStack, HasProcessContext env, HasLogFunc env)
107107
=> ProcessConfig stdin stdoutIgnored stderrIgnored
108108
-> RIO env ()
109-
logProcessStderrStdout pc = withSpan "logProcessStderrStdout" $ withLoggedProcess_ pc $ \p ->
109+
logProcessStderrStdout pc = withSpan_ "logProcessStderrStdout" $ withLoggedProcess_ pc $ \p ->
110110
let logLines = CB.lines .| CL.mapM_ (logInfo . displayBytesUtf8)
111111
in runConcurrently
112112
$ Concurrently (runConduit $ getStdout p .| logLines)
@@ -119,7 +119,7 @@ readProcessNull :: (HasProcessContext env, HasLogFunc env, HasCallStack)
119119
=> String -- ^ Command
120120
-> [String] -- ^ Command line arguments
121121
-> RIO env ()
122-
readProcessNull name args = withSpan "readProcessNull" $
122+
readProcessNull name args = withSpan_ "readProcessNull" $
123123
-- We want the output to appear in any exceptions, so we capture and drop it
124124
void $ proc name args readProcess_
125125

@@ -219,5 +219,5 @@ defaultFirstFalse _ = False
219219
-- | Write a @Builder@ to a file and atomically rename.
220220
writeBinaryFileAtomic :: MonadIO m => Path absrel File -> Builder -> m ()
221221
writeBinaryFileAtomic fp builder =
222-
liftIO $ withSpan "writeBinaryFileAtomic" $
222+
liftIO $ withSpan_ "writeBinaryFileAtomic" $
223223
withBinaryFileAtomic (toFilePath fp) WriteMode (`hPutBuilder` builder)

src/Stack/Runners.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -85,7 +85,7 @@ withConfig
8585
-> RIO Config a
8686
-> RIO Runner a
8787
withConfig shouldReexec inner =
88-
withSpan "Runners.withConfig" $ loadConfig $ \config -> do
88+
withSpan_ "Runners.withConfig" $ loadConfig $ \config -> do
8989
-- If we have been relaunched in a Docker container, perform in-container initialization
9090
-- (switch UID, etc.). We do this after first loading the configuration since it must
9191
-- happen ASAP but needs a configuration.

src/Stack/Setup.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -191,7 +191,7 @@ setupEnv :: NeedTargets
191191
-> BuildOptsCLI
192192
-> Maybe Text -- ^ Message to give user when necessary GHC is not available
193193
-> RIO BuildConfig EnvConfig
194-
setupEnv needTargets boptsCLI mResolveMissingGHC = withSpan "setupEnv" $ do
194+
setupEnv needTargets boptsCLI mResolveMissingGHC = withSpan_ "setupEnv" $ do
195195
config <- view configL
196196
bc <- view buildConfigL
197197
let stackYaml = bcStackYaml bc

src/Stack/Storage/Project.hs

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -87,7 +87,7 @@ initProjectStorage ::
8787
=> Path Abs File -- ^ storage file
8888
-> (ProjectStorage -> RIO env a)
8989
-> RIO env a
90-
initProjectStorage fp f = withSpan "Storage.Project.initProjectStorage" $ SQLite.initStorage "Stack" migrateAll fp $ f . ProjectStorage
90+
initProjectStorage fp f = withSpan_ "Storage.Project.initProjectStorage" $ SQLite.initStorage "Stack" migrateAll fp $ f . ProjectStorage
9191

9292
-- | Run an action in a database transaction
9393
withProjectStorage ::
@@ -138,7 +138,7 @@ loadConfigCache ::
138138
=> ConfigCacheKey
139139
-> RIO env (Maybe ConfigCache)
140140
loadConfigCache key =
141-
withSpan "Storage.Project.loadConfigCache" $ withProjectStorage $ do
141+
withSpan_ "Storage.Project.loadConfigCache" $ withProjectStorage $ do
142142
mparent <- getBy key
143143
case mparent of
144144
Nothing -> return Nothing

0 commit comments

Comments
 (0)