Skip to content

Commit 23ad7c5

Browse files
theobatmpilgrem
authored andcommitted
refactoring: generalize systematic use of StackUnqualCompName
1 parent 6e677f5 commit 23ad7c5

12 files changed

+70
-91
lines changed

src/Path/CheckInstall.hs

+5-6
Original file line numberDiff line numberDiff line change
@@ -6,7 +6,6 @@ module Path.CheckInstall
66
) where
77

88
import Control.Monad.Extra ( (&&^), anyM )
9-
import qualified Data.Text as T
109
import Stack.Prelude
1110
import Stack.Types.Config ( HasConfig )
1211
import qualified System.Directory as D
@@ -15,7 +14,7 @@ import qualified System.FilePath as FP
1514
-- | Checks if the installed executable will be available on the user's PATH.
1615
-- This doesn't use @envSearchPath menv@ because it includes paths only visible
1716
-- when running in the Stack environment.
18-
warnInstallSearchPathIssues :: HasConfig env => FilePath -> [Text] -> RIO env ()
17+
warnInstallSearchPathIssues :: HasConfig env => FilePath -> [String] -> RIO env ()
1918
warnInstallSearchPathIssues destDir installed = do
2019
searchPath <- liftIO FP.getSearchPath
2120
destDirIsInPATH <- liftIO $
@@ -26,28 +25,28 @@ warnInstallSearchPathIssues destDir installed = do
2625
searchPath
2726
if destDirIsInPATH
2827
then forM_ installed $ \exe -> do
29-
mexePath <- (liftIO . D.findExecutable . T.unpack) exe
28+
mexePath <- (liftIO . D.findExecutable) exe
3029
case mexePath of
3130
Just exePath -> do
3231
exeDir <-
3332
(liftIO . fmap FP.takeDirectory . D.canonicalizePath) exePath
3433
unless (exeDir `FP.equalFilePath` destDir) $
3534
prettyWarnL
3635
[ flow "The"
37-
, style File . fromString . T.unpack $ exe
36+
, style File . fromString $ exe
3837
, flow "executable found on the PATH environment variable is"
3938
, style File . fromString $ exePath
4039
, flow "and not the version that was just installed."
4140
, flow "This means that"
42-
, style File . fromString . T.unpack $ exe
41+
, style File . fromString $ exe
4342
, "calls on the command line will not use this version."
4443
]
4544
Nothing ->
4645
prettyWarnL
4746
[ flow "Installation path"
4847
, style Dir . fromString $ destDir
4948
, flow "is on the PATH but the"
50-
, style File . fromString . T.unpack $ exe
49+
, style File . fromString $ exe
5150
, flow "executable that was just installed could not be found on \
5251
\the PATH."
5352
]

src/Stack/Build.hs

+5-5
Original file line numberDiff line numberDiff line change
@@ -20,7 +20,6 @@ import Data.List ( (\\) )
2020
import Data.List.Extra ( groupSort )
2121
import qualified Data.Map as Map
2222
import qualified Data.Set as Set
23-
import qualified Data.Text as T
2423
-- import qualified Distribution.PackageDescription as C
2524
-- import Distribution.Types.Dependency ( Dependency (..), depLibraries )
2625
import Distribution.Version ( mkVersion )
@@ -52,6 +51,7 @@ import Stack.Types.BuildOptsMonoid
5251
)
5352
import Stack.Types.Compiler ( getGhcVersion )
5453
import Stack.Types.CompilerPaths ( HasCompiler, cabalVersionL )
54+
import Stack.Types.ComponentUtils ( StackUnqualCompName, unqualCompToString )
5555
import Stack.Types.Config
5656
( Config (..), HasConfig (..), buildOptsL
5757
)
@@ -266,7 +266,7 @@ warnIfExecutablesWithSameNameCouldBeOverwritten locals plan = do
266266
","
267267
[ style
268268
PkgComponent
269-
(fromString $ packageNameString p <> ":" <> T.unpack exe)
269+
(fromString $ packageNameString p <> ":" <> unqualCompToString exe)
270270
| p <- pkgs
271271
]
272272
prettyWarnL $
@@ -295,7 +295,7 @@ warnIfExecutablesWithSameNameCouldBeOverwritten locals plan = do
295295
-- , package names for other project packages that have an
296296
-- executable with the same name
297297
-- )
298-
warnings :: Map Text ([PackageName],[PackageName])
298+
warnings :: Map StackUnqualCompName ([PackageName],[PackageName])
299299
warnings =
300300
Map.mapMaybe
301301
(\(pkgsToBuild, localPkgs) ->
@@ -315,15 +315,15 @@ warnIfExecutablesWithSameNameCouldBeOverwritten locals plan = do
315315
-- Both cases warrant a warning.
316316
Just (NE.toList pkgsToBuild, otherLocals))
317317
(Map.intersectionWith (,) exesToBuild localExes)
318-
exesToBuild :: Map Text (NonEmpty PackageName)
318+
exesToBuild :: Map StackUnqualCompName (NonEmpty PackageName)
319319
exesToBuild =
320320
collect
321321
[ (exe, pkgName')
322322
| (pkgName', task) <- Map.toList plan.tasks
323323
, TTLocalMutable lp <- [task.taskType]
324324
, exe <- (Set.toList . exeComponents . (.components)) lp
325325
]
326-
localExes :: Map Text (NonEmpty PackageName)
326+
localExes :: Map StackUnqualCompName (NonEmpty PackageName)
327327
localExes =
328328
collect
329329
[ (exe, pkg.name)

src/Stack/Build/Cache.hs

+3-3
Original file line numberDiff line numberDiff line change
@@ -63,6 +63,7 @@ import Stack.Types.Build
6363
)
6464
import Stack.Types.Cache ( ConfigCacheType (..) )
6565
import Stack.Types.CompilerPaths ( cabalVersionL )
66+
import Stack.Types.ComponentUtils ( StackUnqualCompName, unqualCompToString )
6667
import Stack.Types.Config ( stackRootL )
6768
import Stack.Types.ConfigureOpts
6869
( BaseConfigOpts (..), ConfigureOpts (..) )
@@ -134,7 +135,6 @@ buildCacheFile dir component = do
134135
cachesDir <- buildCachesDir dir
135136
smh <- view $ envConfigL . to (.sourceMapHash)
136137
smDirName <- smRelDir smh
137-
let nonLibComponent prefix name = prefix <> "-" <> T.unpack name
138138
cacheFileName <- parseRelFile $ componentCachePath component
139139
pure $ cachesDir </> smDirName </> cacheFileName
140140

@@ -370,7 +370,7 @@ writePrecompiledCache ::
370370
-> ConfigureOpts
371371
-> Bool -- ^ build haddocks
372372
-> Installed -- ^ library
373-
-> Set Text -- ^ executables
373+
-> Set StackUnqualCompName -- ^ executables
374374
-> RIO env ()
375375
writePrecompiledCache
376376
baseConfigOpts
@@ -384,7 +384,7 @@ writePrecompiledCache
384384
ec <- view envConfigL
385385
let stackRootRelative = makeRelative (view stackRootL ec)
386386
exes' <- forM (Set.toList exes) $ \exe -> do
387-
name <- parseRelFile $ T.unpack exe
387+
name <- parseRelFile $ unqualCompToString exe
388388
stackRootRelative $
389389
baseConfigOpts.snapInstallRoot </> bindirSuffix </> name
390390
let installedLibToPath libName ghcPkgId pcAction = do

src/Stack/Build/Execute.hs

+9-7
Original file line numberDiff line numberDiff line change
@@ -64,6 +64,7 @@ import Stack.Types.BuildOptsCLI ( BuildOptsCLI (..) )
6464
import Stack.Types.BuildOptsMonoid ( ProgressBarFormat (..) )
6565
import Stack.Types.Compiler ( ActualCompiler (..) )
6666
import Stack.Types.CompilerPaths ( HasCompiler (..), getGhcPkgExe )
67+
import Stack.Types.ComponentUtils ( StackUnqualCompName, unqualCompToString )
6768
import Stack.Types.Config
6869
( Config (..), HasConfig (..), buildOptsL )
6970
import Stack.Types.ConfigureOpts
@@ -162,7 +163,7 @@ printPlan plan = do
162163
<> line
163164
xs -> do
164165
let executableMsg (name, loc) = fillSep $
165-
fromString (T.unpack name)
166+
fromString (unqualCompToString name)
166167
: "from"
167168
: ( case loc of
168169
Snap -> "snapshot" :: StyleDoc
@@ -260,7 +261,7 @@ executePlan
260261

261262
copyExecutables ::
262263
HasEnvConfig env
263-
=> Map Text InstallLocation
264+
=> Map StackUnqualCompName InstallLocation
264265
-> RIO env ()
265266
copyExecutables exes | Map.null exes = pure ()
266267
copyExecutables exes = do
@@ -283,23 +284,24 @@ copyExecutables exes = do
283284
currExe <- liftIO getExecutablePath -- needed for windows, see below
284285

285286
installed <- forMaybeM (Map.toList exes) $ \(name, loc) -> do
287+
let strName = unqualCompToString name
286288
let bindir =
287289
case loc of
288290
Snap -> snapBin
289291
Local -> localBin
290-
mfp <- forgivingResolveFile bindir (T.unpack name ++ ext)
292+
mfp <- forgivingResolveFile bindir (strName ++ ext)
291293
>>= rejectMissingFile
292294
case mfp of
293295
Nothing -> do
294296
prettyWarnL
295297
[ flow "Couldn't find executable"
296-
, style Current (fromString $ T.unpack name)
298+
, style Current (fromString strName)
297299
, flow "in directory"
298300
, pretty bindir <> "."
299301
]
300302
pure Nothing
301303
Just file -> do
302-
let destFile = destDir' FP.</> T.unpack name ++ ext
304+
let destFile = destDir' FP.</> strName ++ ext
303305
prettyInfoL
304306
[ flow "Copying from"
305307
, pretty file
@@ -311,7 +313,7 @@ copyExecutables exes = do
311313
Platform _ Windows | FP.equalFilePath destFile currExe ->
312314
windowsRenameCopy (toFilePath file) destFile
313315
_ -> D.copyFile (toFilePath file) destFile
314-
pure $ Just (name <> T.pack ext)
316+
pure $ Just (strName ++ ext)
315317

316318
unless (null installed) $ do
317319
prettyInfo $
@@ -321,7 +323,7 @@ copyExecutables exes = do
321323
]
322324
<> line
323325
<> bulletedList
324-
(map (fromString . T.unpack . textDisplay) installed :: [StyleDoc])
326+
(map fromString installed :: [StyleDoc])
325327
unless compilerSpecific $ warnInstallSearchPathIssues destDir' installed
326328

327329
-- | Windows can't write over the current executable. Instead, we rename the

src/Stack/Build/ExecutePackage.hs

+6-10
Original file line numberDiff line numberDiff line change
@@ -32,8 +32,6 @@ import Distribution.System ( OS (..), Platform (..) )
3232
import qualified Distribution.Text as C
3333
import Distribution.Types.MungedPackageName
3434
( encodeCompatPackageName )
35-
import Distribution.Types.UnqualComponentName
36-
( mkUnqualComponentName )
3735
import Distribution.Version ( mkVersion )
3836
import Path
3937
( (</>), addExtension, filename, isProperPrefixOf, parent
@@ -849,9 +847,9 @@ copyPreCompiled ee task pkgId (PrecompiledCache mlib subLibs exes) = do
849847
subLibNames = Set.toList $ buildableSubLibs $ case task.taskType of
850848
TTLocalMutable lp -> lp.package
851849
TTRemotePackage _ p _ -> p
852-
toMungedPackageId :: Text -> MungedPackageId
850+
toMungedPackageId :: StackUnqualCompName -> MungedPackageId
853851
toMungedPackageId subLib =
854-
let subLibName = LSubLibName $ mkUnqualComponentName $ T.unpack subLib
852+
let subLibName = LSubLibName $ toCabalName subLib
855853
in MungedPackageId (MungedPackageName pname subLibName) pversion
856854
toPackageId :: MungedPackageId -> PackageIdentifier
857855
toPackageId (MungedPackageId n v) =
@@ -1247,7 +1245,7 @@ singleTest topts testsToRun ac ee task installedMap = do
12471245
-- | Implements running a package's benchmarks.
12481246
singleBench :: HasEnvConfig env
12491247
=> BenchmarkOpts
1250-
-> [Text]
1248+
-> [StackUnqualCompName]
12511249
-> ActionContext
12521250
-> ExecuteEnv
12531251
-> Task
@@ -1257,7 +1255,7 @@ singleBench beopts benchesToRun ac ee task installedMap = do
12571255
(allDepsMap, _cache) <- getConfigCache ee task installedMap False True
12581256
withSingleContext ac ee task.taskType allDepsMap (Just "bench") $
12591257
\_package _cabalfp _pkgDir cabal announce _outputType -> do
1260-
let args = map T.unpack benchesToRun <> maybe []
1258+
let args = map unqualCompToString benchesToRun <> maybe []
12611259
((:[]) . ("--benchmark-options=" <>))
12621260
beopts.additionalArgs
12631261

@@ -1307,15 +1305,13 @@ primaryComponentOptions lp =
13071305
++ map
13081306
(T.unpack . T.append "lib:")
13091307
(getBuildableListText package.subLibraries)
1310-
++ map
1311-
(T.unpack . T.append "exe:")
1312-
(Set.toList $ exesToBuild lp)
1308+
++ Set.toList (Set.mapMonotonic (\s -> "exe:" ++ unqualCompToString s) (exesToBuild lp))
13131309
where
13141310
package = lp.package
13151311

13161312
-- | Either build all executables or, if the user specifies requested
13171313
-- components, just build them.
1318-
exesToBuild :: LocalPackage -> Set Text
1314+
exesToBuild :: LocalPackage -> Set StackUnqualCompName
13191315
exesToBuild lp = if lp.wanted
13201316
then exeComponents lp.components
13211317
else buildableExes lp.package

src/Stack/Build/Source.hs

+7-7
Original file line numberDiff line numberDiff line change
@@ -25,7 +25,7 @@ import qualified Pantry.SHA256 as SHA256
2525
import Stack.Build.Cache ( tryGetBuildCache )
2626
import Stack.Build.Haddock ( shouldHaddockDeps )
2727
import Stack.Package
28-
( buildableBenchmarksComp, buildableExesComp, buildableTestSuitesComp
28+
( buildableBenchmarks, buildableExes, buildableTestSuites
2929
, hasBuildableMainLibrary, resolvePackage
3030
)
3131
import Stack.PackageFile ( getPackageFile )
@@ -361,17 +361,17 @@ loadLocalPackage pp = do
361361
let (_s, e, t, b) = splitComponents $ Set.toList comps
362362
in (e, t, b)
363363
Just (TargetAll _packageType) ->
364-
( buildableExesComp pkg
364+
( buildableExes pkg
365365
, if bopts.tests
366366
&& maybe True (Set.notMember name . (.skipTest)) mcurator
367-
then buildableTestSuitesComp pkg
367+
then buildableTestSuites pkg
368368
else Set.empty
369369
, if bopts.benchmarks
370370
&& maybe
371371
True
372372
(Set.notMember name . (.skipBenchmark))
373373
mcurator
374-
then buildableBenchmarksComp pkg
374+
then buildableBenchmarks pkg
375375
else Set.empty
376376
)
377377
Nothing -> mempty
@@ -466,9 +466,9 @@ loadLocalPackage pp = do
466466
-- through component parsing, but the components aren't present, then they
467467
-- must not be buildable.
468468
, unbuildable = toComponents
469-
(exes `Set.difference` buildableExesComp pkg)
470-
(tests `Set.difference` buildableTestSuitesComp pkg)
471-
(benches `Set.difference` buildableBenchmarksComp pkg)
469+
(exes `Set.difference` buildableExes pkg)
470+
(tests `Set.difference` buildableTestSuites pkg)
471+
(benches `Set.difference` buildableBenchmarks pkg)
472472
}
473473

474474
-- | Compare the current filesystem state to the cached information, and

src/Stack/Ghci.hs

+10-10
Original file line numberDiff line numberDiff line change
@@ -46,8 +46,8 @@ import Stack.Ghci.Script
4646
, scriptToLazyByteString
4747
)
4848
import Stack.Package
49-
( buildableForeignLibsComp, buildableSubLibsComp, buildableExesComp
50-
, buildableTestSuitesComp, buildableBenchmarksComp, getPackageOpts
49+
( buildableForeignLibs, buildableSubLibs, buildableExes
50+
, buildableTestSuites, buildableBenchmarks, getPackageOpts
5151
, hasBuildableMainLibrary, listOfPackageDeps
5252
, packageFromPackageDescription, readDotBuildinfo
5353
, resolvePackageDescription, topSortPackageComponent
@@ -957,15 +957,15 @@ wantedPackageComponents bopts (TargetAll PTProject) pkg =
957957
else S.empty
958958
)
959959
<> S.mapMonotonic CExe buildableExes'
960-
<> S.mapMonotonic CSubLib buildableSubLibs
961-
<> (if bopts.tests then S.mapMonotonic CTest buildableTestSuites else S.empty)
962-
<> (if bopts.benchmarks then S.mapMonotonic CBench buildableBenchmarks else S.empty)
960+
<> S.mapMonotonic CSubLib buildableSubLibs'
961+
<> (if bopts.tests then S.mapMonotonic CTest buildableTestSuites' else S.empty)
962+
<> (if bopts.benchmarks then S.mapMonotonic CBench buildableBenchmarks' else S.empty)
963963
where
964-
buildableForeignLibs' = buildableForeignLibsComp pkg
965-
buildableSubLibs = buildableSubLibsComp pkg
966-
buildableExes' = buildableExesComp pkg
967-
buildableTestSuites = buildableTestSuitesComp pkg
968-
buildableBenchmarks = buildableBenchmarksComp pkg
964+
buildableForeignLibs' = buildableForeignLibs pkg
965+
buildableSubLibs' = buildableSubLibs pkg
966+
buildableExes' = buildableExes pkg
967+
buildableTestSuites' = buildableTestSuites pkg
968+
buildableBenchmarks' = buildableBenchmarks pkg
969969
wantedPackageComponents _ _ _ = S.empty
970970

971971
checkForIssues :: HasTerm env => [GhciPkgInfo] -> RIO env ()

0 commit comments

Comments
 (0)