ghc-mod/Language/Haskell/GhcMod/CabalApi.hs

144 lines
5.4 KiB
Haskell
Raw Normal View History

2013-03-05 01:21:55 +00:00
{-# LANGUAGE OverloadedStrings #-}
2013-03-03 06:47:03 +00:00
2013-05-17 01:00:01 +00:00
module Language.Haskell.GhcMod.CabalApi (
2013-03-03 06:50:09 +00:00
fromCabalFile
2013-03-03 06:47:03 +00:00
, cabalParseFile
, cabalBuildInfo
2013-03-01 06:25:43 +00:00
, cabalAllDependPackages
, cabalAllSourceDirs
2013-03-04 04:55:03 +00:00
, getGHCVersion
) where
import Control.Applicative
2013-03-04 04:55:03 +00:00
import Control.Exception (throwIO)
import Data.List (intercalate)
import Data.Maybe (maybeToList, listToMaybe)
import Data.Set (fromList, toList)
import Distribution.Package (Dependency(Dependency), PackageName(PackageName))
import Distribution.PackageDescription
import Distribution.PackageDescription.Parse (readPackageDescription)
2013-03-04 04:55:03 +00:00
import Distribution.Simple.Program (ghcProgram)
import Distribution.Simple.Program.Types (programName, programFindVersion)
2013-03-01 06:25:43 +00:00
import Distribution.Text (display)
import Distribution.Verbosity (silent)
2013-03-04 04:55:03 +00:00
import Distribution.Version (versionBranch)
2013-05-17 01:00:01 +00:00
import Language.Haskell.GhcMod.Types
2013-03-03 06:47:03 +00:00
import System.FilePath
----------------------------------------------------------------
2013-03-03 06:50:09 +00:00
fromCabalFile :: [GHCOption]
-> Cradle
2013-03-13 04:17:22 +00:00
-> IO ([GHCOption],[IncludeDir],[Package])
fromCabalFile ghcOptions cradle = do
cabal <- cabalParseFile cfile
case cabalBuildInfo cabal of
2013-05-09 01:09:12 +00:00
Nothing -> throwIO $ userError "cabal file is broken"
Just binfo -> return $ cookInfo ghcOptions cradle cabal binfo
2013-03-05 01:21:55 +00:00
where
Just cfile = cradleCabalFile cradle
2013-03-05 01:21:55 +00:00
cookInfo :: [String] -> Cradle -> GenericPackageDescription -> BuildInfo
-> ([GHCOption],[IncludeDir],[Package])
cookInfo ghcOptions cradle cabal binfo = (gopts,idirs,depPkgs)
2013-03-03 06:47:03 +00:00
where
2013-05-13 03:57:58 +00:00
wdir = cradleCurrentDir cradle
2013-03-04 01:39:39 +00:00
Just cdir = cradleCabalDir cradle
Just cfile = cradleCabalFile cradle
2013-03-05 01:21:55 +00:00
gopts = getGHCOptions ghcOptions binfo
2013-05-13 03:57:58 +00:00
idirs = includeDirectories cdir wdir $ cabalAllSourceDirs cabal
2013-03-05 01:21:55 +00:00
depPkgs = removeMe cfile $ cabalAllDependPackages cabal
2013-03-03 06:47:03 +00:00
removeMe :: FilePath -> [String] -> [String]
removeMe cabalfile = filter (/= me)
where
me = dropExtension $ takeFileName cabalfile
----------------------------------------------------------------
cabalParseFile :: FilePath -> IO GenericPackageDescription
cabalParseFile = readPackageDescription silent
----------------------------------------------------------------
2013-03-05 01:21:55 +00:00
getGHCOptions :: [String] -> BuildInfo -> [String]
getGHCOptions ghcOptions binfo = ghcOptions ++ exts ++ [lang] ++ libs ++ libDirs
where
exts = map (("-X" ++) . display) $ usedExtensions binfo
lang = maybe "-XHaskell98" (("-X" ++) . display) $ defaultLanguage binfo
libs = map ("-l" ++) $ extraLibs binfo
libDirs = map ("-L" ++) $ extraLibDirs binfo
----------------------------------------------------------------
cabalBuildInfo :: GenericPackageDescription -> Maybe BuildInfo
cabalBuildInfo pd = fromLibrary pd <|> fromExecutable pd
where
2013-04-10 06:05:46 +00:00
fromLibrary c = libBuildInfo . condTreeData <$> condLibrary c
fromExecutable c = buildInfo . condTreeData . snd <$> listToMaybe (condExecutables c)
----------------------------------------------------------------
cabalAllSourceDirs :: GenericPackageDescription -> [FilePath]
cabalAllSourceDirs = fromPackageDescription (f libBuildInfo) (f buildInfo) (f testBuildInfo) (f benchmarkBuildInfo)
where
f getBuildInfo = concatMap (hsSourceDirs . getBuildInfo . condTreeData)
cabalAllDependPackages :: GenericPackageDescription -> [Package]
2013-03-01 06:25:43 +00:00
cabalAllDependPackages pd = uniqueAndSort pkgs
where
2013-03-01 06:25:43 +00:00
pkgs = map getDependencyPackageName $ cabalAllDependency pd
2013-03-01 06:25:43 +00:00
cabalAllDependency :: GenericPackageDescription -> [Dependency]
cabalAllDependency = fromPackageDescription getDeps getDeps getDeps getDeps
where
getDeps :: [Tree a] -> [Dependency]
getDeps = concatMap condTreeConstraints
getDependencyPackageName :: Dependency -> Package
2013-03-01 06:25:43 +00:00
getDependencyPackageName (Dependency (PackageName nm) _) = nm
----------------------------------------------------------------
type Tree = CondTree ConfVar [Dependency]
fromPackageDescription :: ([Tree Library] -> [a])
-> ([Tree Executable] -> [a])
-> ([Tree TestSuite] -> [a])
-> ([Tree Benchmark] -> [a])
-> GenericPackageDescription
-> [a]
fromPackageDescription f1 f2 f3 f4 pd = lib ++ exe ++ tests ++ bench
where
lib = f1 . maybeToList . condLibrary $ pd
exe = f2 . map snd . condExecutables $ pd
tests = f3 . map snd . condTestSuites $ pd
bench = f4 . map snd . condBenchmarks $ pd
2013-03-01 06:25:43 +00:00
----------------------------------------------------------------
2013-04-13 17:46:34 +00:00
includeDirectories :: String -> String -> [FilePath] -> [String]
2013-05-13 03:57:58 +00:00
includeDirectories cdir wdir [] = uniqueAndSort [cdir,wdir]
includeDirectories cdir wdir dirs = uniqueAndSort (map (cdir </>) dirs ++ [cdir,wdir])
2013-03-05 01:21:55 +00:00
----------------------------------------------------------------
2013-03-01 06:25:43 +00:00
uniqueAndSort :: [String] -> [String]
uniqueAndSort = toList . fromList
2013-03-04 04:55:03 +00:00
----------------------------------------------------------------
2013-05-20 05:28:56 +00:00
-- | Getting GHC version. 7.6.3 becames 706 in the second of the result.
getGHCVersion :: IO (GHCVersion, Int)
2013-03-04 04:55:03 +00:00
getGHCVersion = ghcVer >>= toTupple
where
ghcVer = programFindVersion ghcProgram silent (programName ghcProgram)
toTupple Nothing = throwIO $ userError "ghc not found"
toTupple (Just v)
| length vs < 2 = return (verstr, 0)
| otherwise = return (verstr, ver)
where
vs = versionBranch v
ver = (vs !! 0) * 100 + (vs !! 1)
verstr = intercalate "." . map show $ vs