Tests: Use getExecutablePath from base...
avoiding the need to depend on the executable-path package.
This commit is contained in:
parent
eacead3eb3
commit
ceadf33246
4 changed files with 3 additions and 5 deletions
|
@ -748,7 +748,6 @@ test-suite test-pandoc
|
|||
directory >= 1.2.3 && < 1.4,
|
||||
doctemplates >= 0.9 && < 0.10,
|
||||
exceptions >= 0.8 && < 0.11,
|
||||
executable-path >= 0.0 && < 0.1,
|
||||
filepath >= 1.1 && < 1.5,
|
||||
hslua >= 1.1 && < 1.4,
|
||||
mtl >= 2.2 && < 2.3,
|
||||
|
|
|
@ -13,7 +13,7 @@ module Tests.Command (runTest, tests)
|
|||
where
|
||||
|
||||
import Data.Algorithm.Diff
|
||||
import System.Environment.Executable (getExecutablePath)
|
||||
import System.Environment (getExecutablePath)
|
||||
import qualified Data.ByteString as BS
|
||||
import qualified Data.Text as T
|
||||
import Data.List (isSuffixOf)
|
||||
|
|
|
@ -14,7 +14,7 @@ module Tests.Old (tests) where
|
|||
import Data.Algorithm.Diff
|
||||
import System.Exit
|
||||
import System.FilePath ((<.>), (</>))
|
||||
import System.Environment.Executable (getExecutablePath)
|
||||
import System.Environment (getExecutablePath)
|
||||
import Text.Pandoc.Process (pipeProcess)
|
||||
import Test.Tasty (TestTree, testGroup)
|
||||
import Test.Tasty.Golden.Advanced (goldenTest)
|
||||
|
|
|
@ -2,12 +2,11 @@
|
|||
|
||||
module Main where
|
||||
|
||||
import System.Environment (getArgs)
|
||||
import System.Environment (getArgs, getExecutablePath)
|
||||
import qualified Control.Exception as E
|
||||
import Text.Pandoc.App (convertWithOpts, defaultOpts, options,
|
||||
parseOptionsFromArgs)
|
||||
import Text.Pandoc.Error (handleError)
|
||||
import System.Environment.Executable (getExecutablePath)
|
||||
import GHC.IO.Encoding
|
||||
import Test.Tasty
|
||||
import qualified Tests.Command
|
||||
|
|
Loading…
Add table
Reference in a new issue