Fix build on case-insensitive filesystems (#873)
This commit is contained in:
parent
084688bb35
commit
97c3f018c4
28
GhcMod.hs
28
GhcMod.hs
@ -69,20 +69,20 @@ module GhcMod (
|
||||
, unloadMappedFile
|
||||
) where
|
||||
|
||||
import GhcMod.Boot
|
||||
import GhcMod.Browse
|
||||
import GhcMod.CaseSplit
|
||||
import GhcMod.Check
|
||||
import GhcMod.Debug
|
||||
import GhcMod.FillSig
|
||||
import GhcMod.Find
|
||||
import GhcMod.Flag
|
||||
import GhcMod.Info
|
||||
import GhcMod.Lang
|
||||
import GhcMod.Lint
|
||||
import GhcMod.Modules
|
||||
import GhcMod.PkgDoc
|
||||
import GhcMod.Test
|
||||
import GhcModExe.Boot
|
||||
import GhcModExe.Browse
|
||||
import GhcModExe.CaseSplit
|
||||
import GhcModExe.Check
|
||||
import GhcModExe.Debug
|
||||
import GhcModExe.FillSig
|
||||
import GhcModExe.Find
|
||||
import GhcModExe.Flag
|
||||
import GhcModExe.Info
|
||||
import GhcModExe.Lang
|
||||
import GhcModExe.Lint
|
||||
import GhcModExe.Modules
|
||||
import GhcModExe.PkgDoc
|
||||
import GhcModExe.Test
|
||||
import Language.Haskell.GhcMod.Cradle
|
||||
import Language.Haskell.GhcMod.FileMapping
|
||||
import Language.Haskell.GhcMod.Logging
|
||||
|
@ -1,12 +1,12 @@
|
||||
module GhcMod.Boot where
|
||||
module GhcModExe.Boot where
|
||||
|
||||
import Control.Applicative
|
||||
import Prelude
|
||||
|
||||
import GhcMod.Browse
|
||||
import GhcMod.Flag
|
||||
import GhcMod.Lang
|
||||
import GhcMod.Modules
|
||||
import GhcModExe.Browse
|
||||
import GhcModExe.Flag
|
||||
import GhcModExe.Lang
|
||||
import GhcModExe.Modules
|
||||
import Language.Haskell.GhcMod.Monad
|
||||
import Language.Haskell.GhcMod.Types (defaultBrowseOpts)
|
||||
|
@ -1,5 +1,5 @@
|
||||
{-# LANGUAGE CPP #-}
|
||||
module GhcMod.Browse (
|
||||
module GhcModExe.Browse (
|
||||
browse,
|
||||
BrowseOpts(..)
|
||||
) where
|
@ -1,6 +1,6 @@
|
||||
{-# LANGUAGE CPP #-}
|
||||
|
||||
module GhcMod.CaseSplit (
|
||||
module GhcModExe.CaseSplit (
|
||||
splits
|
||||
) where
|
||||
|
@ -1,4 +1,4 @@
|
||||
module GhcMod.Check (
|
||||
module GhcModExe.Check (
|
||||
checkSyntax
|
||||
, check
|
||||
, expandTemplate
|
@ -1,4 +1,4 @@
|
||||
module GhcMod.Debug (debugInfo, rootInfo, componentInfo) where
|
||||
module GhcModExe.Debug (debugInfo, rootInfo, componentInfo) where
|
||||
|
||||
import Control.Arrow (first)
|
||||
import Control.Applicative
|
||||
@ -11,7 +11,7 @@ import Data.Version
|
||||
import Data.List.Split
|
||||
import System.Directory
|
||||
|
||||
import GhcMod.Internal
|
||||
import GhcModExe.Internal
|
||||
import Language.Haskell.GhcMod.Cradle
|
||||
import Language.Haskell.GhcMod.Monad
|
||||
import Language.Haskell.GhcMod.Output
|
@ -1,7 +1,7 @@
|
||||
{-# LANGUAGE CPP, MultiParamTypeClasses, FunctionalDependencies #-}
|
||||
{-# LANGUAGE FlexibleInstances #-}
|
||||
|
||||
module GhcMod.FillSig (
|
||||
module GhcModExe.FillSig (
|
||||
sig
|
||||
, refine
|
||||
, auto
|
@ -1,6 +1,6 @@
|
||||
{-# LANGUAGE CPP, BangPatterns, TupleSections, DeriveGeneric #-}
|
||||
|
||||
module GhcMod.Find
|
||||
module GhcModExe.Find
|
||||
#ifndef SPEC
|
||||
( Symbol
|
||||
, SymbolDb
|
@ -1,4 +1,4 @@
|
||||
module GhcMod.Flag where
|
||||
module GhcModExe.Flag where
|
||||
|
||||
import qualified Language.Haskell.GhcMod.Gap as Gap
|
||||
import Language.Haskell.GhcMod.Convert
|
@ -1,4 +1,4 @@
|
||||
module GhcMod.Info (
|
||||
module GhcModExe.Info (
|
||||
info
|
||||
, types
|
||||
) where
|
@ -1,6 +1,6 @@
|
||||
-- | Low level access to the ghc-mod library.
|
||||
|
||||
module GhcMod.Internal (
|
||||
module GhcModExe.Internal (
|
||||
-- * Types
|
||||
GHCOption
|
||||
, IncludeDir
|
@ -1,4 +1,4 @@
|
||||
module GhcMod.Lang where
|
||||
module GhcModExe.Lang where
|
||||
|
||||
import DynFlags (supportedLanguagesAndExtensions)
|
||||
import Language.Haskell.GhcMod.Convert
|
@ -1,4 +1,4 @@
|
||||
module GhcMod.Lint where
|
||||
module GhcModExe.Lint where
|
||||
|
||||
import Exception (ghandle)
|
||||
import Control.Exception (SomeException(..))
|
@ -1,4 +1,4 @@
|
||||
module GhcMod.Modules (modules) where
|
||||
module GhcModExe.Modules (modules) where
|
||||
|
||||
import Control.Arrow
|
||||
import Data.List
|
@ -1,4 +1,4 @@
|
||||
module GhcMod.PkgDoc (pkgDoc) where
|
||||
module GhcModExe.PkgDoc (pkgDoc) where
|
||||
|
||||
import Language.Haskell.GhcMod.Types
|
||||
import Language.Haskell.GhcMod.GhcPkg
|
@ -1,4 +1,4 @@
|
||||
module GhcMod.Test where
|
||||
module GhcModExe.Test where
|
||||
|
||||
import Control.Applicative
|
||||
import Data.List
|
@ -115,21 +115,21 @@ Library
|
||||
HS-Source-Dirs: ., core
|
||||
Exposed-Modules:
|
||||
GhcMod
|
||||
GhcMod.Boot
|
||||
GhcMod.Browse
|
||||
GhcMod.CaseSplit
|
||||
GhcMod.Check
|
||||
GhcMod.Debug
|
||||
GhcMod.FillSig
|
||||
GhcMod.Find
|
||||
GhcMod.Flag
|
||||
GhcMod.Info
|
||||
GhcMod.Internal
|
||||
GhcMod.Lang
|
||||
GhcMod.Lint
|
||||
GhcMod.Modules
|
||||
GhcMod.PkgDoc
|
||||
GhcMod.Test
|
||||
GhcModExe.Boot
|
||||
GhcModExe.Browse
|
||||
GhcModExe.CaseSplit
|
||||
GhcModExe.Check
|
||||
GhcModExe.Debug
|
||||
GhcModExe.FillSig
|
||||
GhcModExe.Find
|
||||
GhcModExe.Flag
|
||||
GhcModExe.Info
|
||||
GhcModExe.Internal
|
||||
GhcModExe.Lang
|
||||
GhcModExe.Lint
|
||||
GhcModExe.Modules
|
||||
GhcModExe.PkgDoc
|
||||
GhcModExe.Test
|
||||
Language.Haskell.GhcMod.CabalHelper
|
||||
Language.Haskell.GhcMod.Caching
|
||||
Language.Haskell.GhcMod.Caching.Types
|
||||
@ -212,7 +212,7 @@ Library
|
||||
|
||||
Executable ghc-mod
|
||||
Default-Language: Haskell2010
|
||||
Main-Is: GHCMod.hs
|
||||
Main-Is: GHCModMain.hs
|
||||
Other-Modules: Paths_ghc_mod
|
||||
, GHCMod.Options
|
||||
, GHCMod.Options.Commands
|
||||
|
@ -17,8 +17,8 @@ import Prelude
|
||||
|
||||
import GHCMod.Options
|
||||
import GhcMod
|
||||
import GhcMod.Find
|
||||
import GhcMod.Internal hiding (MonadIO,liftIO)
|
||||
import GhcModExe.Find
|
||||
import GhcModExe.Internal hiding (MonadIO,liftIO)
|
||||
import Language.Haskell.GhcMod.Monad
|
||||
import Language.Haskell.GhcMod.Types
|
||||
|
Loading…
Reference in New Issue
Block a user