{-# LANGUAGE CPP #-}
module Mueval.Context (
cleanModules,
defaultModules,
defaultPackages,
qualifiedModules,
) where
cleanModules :: [String] -> Bool
cleanModules :: [String] -> Bool
cleanModules = (String -> Bool) -> [String] -> Bool
forall (t :: * -> *) a. Foldable t => (a -> Bool) -> t a -> Bool
all (String -> [String] -> Bool
forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
`elem` [String]
defaultModules)
defaultModules :: [String]
defaultModules :: [String]
defaultModules = ["Prelude",
"ShowFun",
"Debug.SimpleReflect",
"Data.Function",
"Control.Applicative",
"Control.Arrow",
"Control.Monad",
"Control.Monad.Cont",
#if __GLASGOW_HASKELL__ >= 710
"Control.Monad.Except",
#else
"Control.Monad.Error",
#endif
"Control.Monad.Fix",
"Control.Monad.Identity",
#if !MIN_VERSION_base(4,7,0)
"Control.Monad.Instances",
#endif
"Control.Monad.RWS",
"Control.Monad.Reader",
"Control.Monad.State",
"Control.Monad.State",
"Control.Monad.Writer",
"Data.Array",
"Data.Bits",
"Data.Bool",
"Data.Char",
"Data.Complex",
"Data.Dynamic",
"Data.Either",
"Data.Eq",
"Data.Fixed",
"Data.Graph",
"Data.Int",
"Data.Ix",
"Data.List",
"Data.Maybe",
"Data.Monoid",
"Data.Ord",
"Data.Ratio",
"Data.Tree",
"Data.Tuple",
"Data.Typeable",
"Data.Word",
"System.Random",
"Test.QuickCheck",
"Text.PrettyPrint.HughesPJ",
"Text.Printf"]
defaultPackages :: [String]
defaultPackages :: [String]
defaultPackages = [ "array"
, "base"
, "bytestring"
, "containers"
]
qualifiedModules :: [(String, Maybe String)]
qualifiedModules :: [(String, Maybe String)]
qualifiedModules = [
("Data.ByteString", String -> Maybe String
forall a. a -> Maybe a
Just "BS"),
("Data.ByteString.Char8", String -> Maybe String
forall a. a -> Maybe a
Just "BSC"),
("Data.ByteString.Lazy", String -> Maybe String
forall a. a -> Maybe a
Just "BSL"),
("Data.ByteString.Lazy.Char8", String -> Maybe String
forall a. a -> Maybe a
Just "BSLC"),
("Data.Foldable", String -> Maybe String
forall a. a -> Maybe a
Just "Data.Foldable"),
("Data.IntMap", String -> Maybe String
forall a. a -> Maybe a
Just "IM"),
("Data.IntSet", String -> Maybe String
forall a. a -> Maybe a
Just "IS"),
("Data.Map", String -> Maybe String
forall a. a -> Maybe a
Just "M"),
("Data.Sequence", String -> Maybe String
forall a. a -> Maybe a
Just "Data.Sequence"),
("Data.Set", String -> Maybe String
forall a. a -> Maybe a
Just "S"),
("Data.Traversable", String -> Maybe String
forall a. a -> Maybe a
Just "Data.Traversable") ]