Cleanup some dead code
This commit is contained in:
parent
0b2a3458fd
commit
5af2c939b3
@ -17,7 +17,6 @@
|
|||||||
{-# LANGUAGE ExistentialQuantification #-}
|
{-# LANGUAGE ExistentialQuantification #-}
|
||||||
module Language.Haskell.GhcMod.Error (
|
module Language.Haskell.GhcMod.Error (
|
||||||
GhcModError(..)
|
GhcModError(..)
|
||||||
, GMConfigStateFileError(..)
|
|
||||||
, GmError
|
, GmError
|
||||||
, gmeDoc
|
, gmeDoc
|
||||||
, ghcExceptionDoc
|
, ghcExceptionDoc
|
||||||
@ -53,37 +52,6 @@ import Language.Haskell.GhcMod.Pretty
|
|||||||
|
|
||||||
type GmError m = MonadError GhcModError m
|
type GmError m = MonadError GhcModError m
|
||||||
|
|
||||||
gmCsfeDoc :: GMConfigStateFileError -> Doc
|
|
||||||
gmCsfeDoc GMConfigStateFileNoHeader = text $
|
|
||||||
"Saved package config file header is missing. "
|
|
||||||
++ "Try re-running the 'configure' command."
|
|
||||||
|
|
||||||
gmCsfeDoc GMConfigStateFileBadHeader = text $
|
|
||||||
"Saved package config file header is corrupt. "
|
|
||||||
++ "Try re-running the 'configure' command."
|
|
||||||
|
|
||||||
gmCsfeDoc GMConfigStateFileNoParse = text $
|
|
||||||
"Saved package config file body is corrupt. "
|
|
||||||
++ "Try re-running the 'configure' command."
|
|
||||||
|
|
||||||
gmCsfeDoc GMConfigStateFileMissing = text $
|
|
||||||
"Run the 'configure' command first."
|
|
||||||
|
|
||||||
-- gmCsfeDoc (ConfigStateFileBadVersion oldCabal oldCompiler _) = text $
|
|
||||||
-- "You need to re-run the 'configure' command. "
|
|
||||||
-- ++ "The version of Cabal being used has changed (was "
|
|
||||||
-- ++ display oldCabal ++ ", now "
|
|
||||||
-- ++ display currentCabalId ++ ")."
|
|
||||||
-- ++ badCompiler
|
|
||||||
-- where
|
|
||||||
-- badCompiler
|
|
||||||
-- | oldCompiler == currentCompilerId = ""
|
|
||||||
-- | otherwise =
|
|
||||||
-- " Additionally the compiler is different (was "
|
|
||||||
-- ++ display oldCompiler ++ ", now "
|
|
||||||
-- ++ display currentCompilerId
|
|
||||||
-- ++ ") which is probably the cause of the problem."
|
|
||||||
|
|
||||||
gmeDoc :: GhcModError -> Doc
|
gmeDoc :: GhcModError -> Doc
|
||||||
gmeDoc e = case e of
|
gmeDoc e = case e of
|
||||||
GMENoMsg ->
|
GMENoMsg ->
|
||||||
@ -91,12 +59,11 @@ gmeDoc e = case e of
|
|||||||
GMEString msg ->
|
GMEString msg ->
|
||||||
text msg
|
text msg
|
||||||
GMECabalConfigure msg ->
|
GMECabalConfigure msg ->
|
||||||
text "Configuring cabal project failed: " <> gmeDoc msg
|
text "Configuring cabal project failed" <+>: gmeDoc msg
|
||||||
GMECabalFlags msg ->
|
GMEStackConfigure msg ->
|
||||||
text "Retrieval of the cabal configuration flags failed: " <> gmeDoc msg
|
text "Configuring stack project failed" <+>: gmeDoc msg
|
||||||
GMECabalComponent cn ->
|
GMEStackBootstrap msg ->
|
||||||
text "Cabal component " <> quotes (gmComponentNameDoc cn)
|
text "Bootstrapping stack project environment failed" <+>: gmeDoc msg
|
||||||
<> text " could not be found."
|
|
||||||
GMECabalCompAssignment ctx ->
|
GMECabalCompAssignment ctx ->
|
||||||
text "Could not find a consistent component assignment for modules:" $$
|
text "Could not find a consistent component assignment for modules:" $$
|
||||||
(nest 4 $ foldr ($+$) empty $ map ctxDoc ctx) $$
|
(nest 4 $ foldr ($+$) empty $ map ctxDoc ctx) $$
|
||||||
@ -125,7 +92,6 @@ gmeDoc e = case e of
|
|||||||
compsDoc sc | Set.null sc = text "has no known components"
|
compsDoc sc | Set.null sc = text "has no known components"
|
||||||
compsDoc sc = fsep $ punctuate comma $
|
compsDoc sc = fsep $ punctuate comma $
|
||||||
map gmComponentNameDoc $ Set.toList sc
|
map gmComponentNameDoc $ Set.toList sc
|
||||||
|
|
||||||
GMEProcess _fn cmd args emsg -> let c = showCommandForUser cmd args in
|
GMEProcess _fn cmd args emsg -> let c = showCommandForUser cmd args in
|
||||||
case emsg of
|
case emsg of
|
||||||
Right err ->
|
Right err ->
|
||||||
@ -138,11 +104,6 @@ gmeDoc e = case e of
|
|||||||
GMETooManyCabalFiles cfs ->
|
GMETooManyCabalFiles cfs ->
|
||||||
text $ "Multiple cabal files found. Possible cabal files: \""
|
text $ "Multiple cabal files found. Possible cabal files: \""
|
||||||
++ intercalate "\", \"" cfs ++"\"."
|
++ intercalate "\", \"" cfs ++"\"."
|
||||||
GMECabalStateFile csfe ->
|
|
||||||
gmCsfeDoc csfe
|
|
||||||
GMEStackBootrap msg ->
|
|
||||||
(text $ "Boostrapping stack project failed")
|
|
||||||
<+>: text msg
|
|
||||||
GMEWrongWorkingDirectory projdir cdir ->
|
GMEWrongWorkingDirectory projdir cdir ->
|
||||||
(text $ "You must run ghc-mod in the project directory as returned by `ghc-mod root`.")
|
(text $ "You must run ghc-mod in the project directory as returned by `ghc-mod root`.")
|
||||||
<+> text "Currently in:" <+> showDoc cdir
|
<+> text "Currently in:" <+> showDoc cdir
|
||||||
@ -169,7 +130,6 @@ ghcExceptionDoc (Panic msg) = vcat $ map text $ lines $ printf "\
|
|||||||
|
|
||||||
ghcExceptionDoc e = text $ showGhcException e ""
|
ghcExceptionDoc e = text $ showGhcException e ""
|
||||||
|
|
||||||
|
|
||||||
liftMaybe :: MonadError e m => e -> m (Maybe a) -> m a
|
liftMaybe :: MonadError e m => e -> m (Maybe a) -> m a
|
||||||
liftMaybe e action = maybe (throwError e) return =<< action
|
liftMaybe e action = maybe (throwError e) return =<< action
|
||||||
|
|
||||||
@ -183,7 +143,6 @@ infixr 0 `modifyError'`
|
|||||||
modifyError' :: MonadError e m => m a -> (e -> e) -> m a
|
modifyError' :: MonadError e m => m a -> (e -> e) -> m a
|
||||||
modifyError' = flip modifyError
|
modifyError' = flip modifyError
|
||||||
|
|
||||||
|
|
||||||
modifyGmError :: (MonadIO m, ExceptionMonad m)
|
modifyGmError :: (MonadIO m, ExceptionMonad m)
|
||||||
=> (GhcModError -> GhcModError) -> m a -> m a
|
=> (GhcModError -> GhcModError) -> m a -> m a
|
||||||
modifyGmError f a = gcatch a $ \(ex :: GhcModError) -> liftIO $ throwIO (f ex)
|
modifyGmError f a = gcatch a $ \(ex :: GhcModError) -> liftIO $ throwIO (f ex)
|
||||||
|
@ -86,4 +86,4 @@ readStack args = do
|
|||||||
lift $ flip gcatch (\(e :: IOError) -> exToErr e) $ do
|
lift $ flip gcatch (\(e :: IOError) -> exToErr e) $ do
|
||||||
liftIO $ evaluate =<< readProc stack args ""
|
liftIO $ evaluate =<< readProc stack args ""
|
||||||
where
|
where
|
||||||
exToErr = throw . GMEStackBootrap . show
|
exToErr = throw . GMEStackBootstrap . GMEString . show
|
||||||
|
@ -379,11 +379,11 @@ data GhcModError
|
|||||||
| GMECabalConfigure GhcModError
|
| GMECabalConfigure GhcModError
|
||||||
-- ^ Configuring a cabal project failed.
|
-- ^ Configuring a cabal project failed.
|
||||||
|
|
||||||
| GMECabalFlags GhcModError
|
| GMEStackConfigure GhcModError
|
||||||
-- ^ Retrieval of the cabal configuration flags failed.
|
-- ^ Configuring a stack project failed.
|
||||||
|
|
||||||
| GMECabalComponent ChComponentName
|
| GMEStackBootstrap GhcModError
|
||||||
-- ^ Cabal component could not be found
|
-- ^ Bootstrapping @stack@ environment failed (process exited with failure)
|
||||||
|
|
||||||
| GMECabalCompAssignment [(Either FilePath ModuleName, Set ChComponentName)]
|
| GMECabalCompAssignment [(Either FilePath ModuleName, Set ChComponentName)]
|
||||||
-- ^ Could not find a consistent component assignment for modules
|
-- ^ Could not find a consistent component assignment for modules
|
||||||
@ -398,12 +398,6 @@ data GhcModError
|
|||||||
| GMETooManyCabalFiles [FilePath]
|
| GMETooManyCabalFiles [FilePath]
|
||||||
-- ^ Too many cabal files found.
|
-- ^ Too many cabal files found.
|
||||||
|
|
||||||
| GMECabalStateFile GMConfigStateFileError
|
|
||||||
-- ^ Reading Cabal's state configuration file falied somehow.
|
|
||||||
|
|
||||||
| GMEStackBootrap String
|
|
||||||
-- ^ Bootstrapping @stack@ environment failed (process exited with failure)
|
|
||||||
|
|
||||||
| GMEWrongWorkingDirectory FilePath FilePath
|
| GMEWrongWorkingDirectory FilePath FilePath
|
||||||
|
|
||||||
deriving (Eq,Show,Typeable)
|
deriving (Eq,Show,Typeable)
|
||||||
@ -414,15 +408,6 @@ instance Error GhcModError where
|
|||||||
|
|
||||||
instance Exception GhcModError
|
instance Exception GhcModError
|
||||||
|
|
||||||
data GMConfigStateFileError
|
|
||||||
= GMConfigStateFileNoHeader
|
|
||||||
| GMConfigStateFileBadHeader
|
|
||||||
| GMConfigStateFileNoParse
|
|
||||||
| GMConfigStateFileMissing
|
|
||||||
-- | GMConfigStateFileBadVersion PackageIdentifier PackageIdentifier (Either ConfigStateFileError LocalBuildInfo)
|
|
||||||
deriving (Eq, Show, Read, Typeable)
|
|
||||||
|
|
||||||
|
|
||||||
deriving instance Generic Version
|
deriving instance Generic Version
|
||||||
instance Serialize Version
|
instance Serialize Version
|
||||||
|
|
||||||
|
Loading…
Reference in New Issue
Block a user