Skip to content
Snippets Groups Projects
Commit 5cac755e authored by Mikhail Glushenkov's avatar Mikhail Glushenkov
Browse files

-Wall police.

parent d1f8b1a5
No related branches found
No related tags found
No related merge requests found
{-# LANGUAGE CPP #-}
module PackageTests.Exec.Check
( tests
) where
......@@ -9,7 +10,9 @@ import Test.Framework as TF (Test)
import Test.Framework.Providers.HUnit (testCase)
import Test.HUnit (assertBool)
#if !MIN_VERSION_base(4,8,0)
import Control.Applicative ((<$>))
#endif
import Control.Monad (when)
import Data.List (intercalate, isInfixOf)
import System.FilePath ((</>))
......
{-# LANGUAGE CPP #-}
module UnitTests.Distribution.Client.UserConfig
( tests
) where
import Control.Exception (bracket)
import Data.List (sort, nub)
#if !MIN_VERSION_base(4,8,0)
import Data.Monoid
#endif
import System.Directory (getCurrentDirectory, removeDirectoryRecursive, createDirectoryIfMissing)
import System.FilePath (takeDirectory)
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment