ghc-mod/test/TestUtils.hs

125 lines
3.3 KiB
Haskell
Raw Permalink Normal View History

2015-03-04 20:48:21 +00:00
{-# OPTIONS_GHC -fno-warn-orphans #-}
2014-05-10 13:10:34 +00:00
module TestUtils (
run
, runD
2014-08-12 16:11:32 +00:00
, runD'
2015-03-04 20:48:21 +00:00
, runE
, runNullLog
, runGmOutDef
, runLogDef
2014-08-12 16:11:32 +00:00
, shouldReturnError
2015-02-07 15:41:15 +00:00
, isPkgDbAt
, isPkgConfDAt
, module GhcMod.Monad
, module GhcMod.Types
2014-05-10 13:10:34 +00:00
) where
import GhcMod.Logging
import GhcMod.Monad
import GhcMod.Cradle
import GhcMod.Types
2014-05-10 13:10:34 +00:00
2015-03-04 20:48:21 +00:00
import Control.Arrow
2015-08-31 06:01:20 +00:00
import Control.Category
2015-03-04 20:48:21 +00:00
import Control.Applicative
import Control.Monad.Error (ErrorT, runErrorT)
import Control.Monad.Trans.Journal
2015-02-07 15:41:15 +00:00
import Data.List.Split
2015-08-31 06:01:20 +00:00
import Data.Label
2015-03-04 20:48:21 +00:00
import Data.String
2015-02-07 15:41:15 +00:00
import System.FilePath
2015-03-04 20:48:21 +00:00
import System.Directory
2014-08-12 16:11:32 +00:00
import Test.Hspec
2015-08-31 06:01:20 +00:00
import Prelude hiding ((.))
2014-08-12 16:11:32 +00:00
2015-03-04 20:48:21 +00:00
import Exception
testLogLevel :: GmLogLevel
2015-03-06 13:04:49 +00:00
testLogLevel = GmDebug
2014-05-10 13:10:34 +00:00
2014-08-21 05:16:56 +00:00
extract :: Show e => IO (Either e a, w) -> IO a
2014-07-22 17:45:48 +00:00
extract action = do
2014-08-21 05:16:56 +00:00
(r,_) <- action
case r of
Right a -> return a
Left e -> error $ show e
2014-07-22 17:45:48 +00:00
2015-03-04 20:48:21 +00:00
runGhcModTSpec :: Options -> GhcModT IO a -> IO (Either GhcModError a, GhcModLog)
runGhcModTSpec opt action = do
dir <- getCurrentDirectory
runGhcModTSpec' dir opt action
2014-05-10 13:10:34 +00:00
2015-03-04 20:48:21 +00:00
runGhcModTSpec' :: IOish m
=> FilePath -> Options -> GhcModT m b -> m (Either GhcModError b, GhcModLog)
runGhcModTSpec' dir opt action = liftIO (canonicalizePath dir) >>= \dir' -> do
2015-09-14 08:11:33 +00:00
runGmOutT opt $
2015-11-25 15:06:24 +00:00
withGhcModEnv' withSpecCradle dir' opt $ \(env,_) -> do
2015-09-14 08:11:33 +00:00
first (fst <$>) <$> runGhcModT' env defaultGhcModState
(gmSetLogLevel (ooptLogLevel $ optOutput opt) >> action)
where
withSpecCradle :: (IOish m, GmOut m) => FilePath -> ((Cradle, GhcModLog) -> m a) -> m a
withSpecCradle cradledir f =
gbracket
(runJournalT $ findSpecCradle (optPrograms opt) cradledir)
(liftIO . cleanupCradle . fst) f
2014-05-10 13:10:34 +00:00
-- | Run GhcMod
run :: Options -> GhcModT IO a -> IO a
2015-03-04 20:48:21 +00:00
run opt a = extract $ runGhcModTSpec opt a
2014-05-10 13:10:34 +00:00
-- | Run GhcMod with default options
runD :: GhcModT IO a -> IO a
2015-03-04 20:48:21 +00:00
runD =
2015-08-31 06:01:20 +00:00
extract . runGhcModTSpec (setLogLevel testLogLevel defaultOptions)
2014-08-12 16:11:32 +00:00
2015-03-04 20:48:21 +00:00
runD' :: FilePath -> GhcModT IO a -> IO a
runD' dir =
2015-08-31 06:01:20 +00:00
extract . runGhcModTSpec' dir (setLogLevel testLogLevel defaultOptions)
setLogLevel :: GmLogLevel -> Options -> Options
setLogLevel = set (lOoptLogLevel . lOptOutput)
2015-03-04 20:48:21 +00:00
runE :: ErrorT e IO a -> IO (Either e a)
runE = runErrorT
runNullLog :: MonadIO m => JournalT GhcModLog m a -> m a
runNullLog action = do
(a,w) <- runJournalT action
2015-05-06 14:13:08 +00:00
liftIO $ print w
2015-03-04 20:48:21 +00:00
return a
2014-08-12 16:11:32 +00:00
runGmOutDef :: IOish m => GmOutT m a -> m a
2015-09-14 08:11:33 +00:00
runGmOutDef = runGmOutT defaultOptions
runLogDef :: IOish m => GmOutT (JournalT GhcModLog m) a -> m a
runLogDef = fmap fst . runJournalT . runGmOutDef
2014-08-12 16:11:32 +00:00
shouldReturnError :: Show a
=> IO (Either GhcModError a, GhcModLog)
-> Expectation
shouldReturnError action = do
(a,_) <- action
a `shouldSatisfy` isLeft
where
isLeft (Left _) = True
isLeft _ = False
2015-02-07 15:41:15 +00:00
isPkgConfD :: FilePath -> Bool
isPkgConfD d = let
(_dir, pkgconfd) = splitFileName d
in case splitOn "-" pkgconfd of
[_arch, _platform, _compiler, _compver, "packages.conf.d"] -> True
_ -> False
isPkgConfDAt :: FilePath -> FilePath -> Bool
isPkgConfDAt d d' | d == takeDirectory d' && isPkgConfD d' = True
isPkgConfDAt _ _ = False
isPkgDbAt :: FilePath -> GhcPkgDb -> Bool
isPkgDbAt d (PackageDb dir) = isPkgConfDAt d dir
isPkgDbAt _ _ = False
2015-03-04 20:48:21 +00:00
instance IsString ModuleName where
fromString = mkModuleName