Prepare for splitting off ghc-mod-core eventually
This commit is contained in:
@@ -1,7 +1,7 @@
|
||||
module BrowseSpec where
|
||||
|
||||
import Control.Applicative
|
||||
import Language.Haskell.GhcMod
|
||||
import GhcMod
|
||||
import Test.Hspec
|
||||
import Prelude
|
||||
|
||||
|
||||
@@ -1,7 +1,7 @@
|
||||
{-# LANGUAGE CPP #-}
|
||||
module CaseSplitSpec where
|
||||
|
||||
import Language.Haskell.GhcMod
|
||||
import GhcMod
|
||||
import Test.Hspec
|
||||
import TestUtils
|
||||
import Dir
|
||||
|
||||
@@ -1,7 +1,7 @@
|
||||
{-# LANGUAGE CPP #-}
|
||||
module CheckSpec where
|
||||
|
||||
import Language.Haskell.GhcMod
|
||||
import GhcMod
|
||||
|
||||
import Data.List
|
||||
import System.Process
|
||||
|
||||
@@ -9,7 +9,7 @@ import Dir
|
||||
import System.IO.Temp
|
||||
import System.Directory
|
||||
|
||||
import Language.Haskell.GhcMod
|
||||
import GhcMod
|
||||
|
||||
spec :: Spec
|
||||
spec = do
|
||||
|
||||
@@ -1,7 +1,7 @@
|
||||
{-# LANGUAGE OverloadedStrings #-}
|
||||
module FindSpec where
|
||||
|
||||
import Language.Haskell.GhcMod.Find
|
||||
import GhcMod.Find
|
||||
import Test.Hspec
|
||||
import TestUtils
|
||||
|
||||
|
||||
@@ -1,7 +1,7 @@
|
||||
module FlagSpec where
|
||||
|
||||
import Control.Applicative
|
||||
import Language.Haskell.GhcMod
|
||||
import GhcMod
|
||||
import Test.Hspec
|
||||
import TestUtils
|
||||
import Prelude
|
||||
|
||||
@@ -3,7 +3,7 @@ module InfoSpec where
|
||||
|
||||
import Control.Applicative
|
||||
import Data.List (isPrefixOf)
|
||||
import Language.Haskell.GhcMod
|
||||
import GhcMod
|
||||
#if __GLASGOW_HASKELL__ < 706
|
||||
import System.Environment.Executable (getExecutablePath)
|
||||
#else
|
||||
|
||||
@@ -1,7 +1,7 @@
|
||||
module LangSpec where
|
||||
|
||||
import Control.Applicative
|
||||
import Language.Haskell.GhcMod
|
||||
import GhcMod
|
||||
import Test.Hspec
|
||||
import TestUtils
|
||||
import Prelude
|
||||
|
||||
@@ -1,6 +1,6 @@
|
||||
module LintSpec where
|
||||
|
||||
import Language.Haskell.GhcMod
|
||||
import GhcMod
|
||||
import Test.Hspec
|
||||
import TestUtils
|
||||
|
||||
|
||||
@@ -1,7 +1,7 @@
|
||||
module ListSpec where
|
||||
|
||||
import Control.Applicative
|
||||
import Language.Haskell.GhcMod
|
||||
import GhcMod
|
||||
import Test.Hspec
|
||||
import TestUtils
|
||||
import Prelude
|
||||
|
||||
@@ -4,7 +4,7 @@ import Dir
|
||||
|
||||
import Control.Exception as E
|
||||
import Control.Monad (void)
|
||||
import Language.Haskell.GhcMod (debugInfo)
|
||||
import GhcMod (debugInfo)
|
||||
import System.Process
|
||||
import System.Environment
|
||||
import Test.Hspec
|
||||
|
||||
@@ -15,7 +15,8 @@ main = do
|
||||
, "-package", "directory-" ++ VERSION_directory
|
||||
, "-XScopedTypeVariables", "-XRecordWildCards", "-XNamedFieldPuns", "-XConstraintKinds", "-XFlexibleContexts", "-XDataKinds", "-XKindSignatures", "-XTypeOperators", "-XViewPatterns"
|
||||
, "-i" ++ distdir ++ "/build/autogen/"
|
||||
, "-optP-include"
|
||||
, "-optP" ++ distdir ++ "/build/autogen/cabal_macros.h"
|
||||
, "Language/Haskell/GhcMod.hs"
|
||||
, "-icore/"
|
||||
-- , "-optP-include"
|
||||
-- , "-optP" ++ distdir ++ "/build/autogen/cabal_macros.h"
|
||||
, "GhcMod.hs"
|
||||
]
|
||||
|
||||
Reference in New Issue
Block a user