#1617: :types <module> (or :browse! <module>) - browse plain types, not in
context, for IDEs
------------------------+---------------------------------------------------
Reporter: claus | Owner:
Type: bug | Status: new
Priority: normal | Milestone:
Component: GHCi | Version: 6.6.1
Severity: normal | Resolution:
Keywords: | Difficulty: Unknown
Os: Unknown | Testcase:
Architecture: Unknown |
------------------------+---------------------------------------------------
Changes (by claus):
* type: feature request => bug
Comment:
:browse also does not show all identifiers, nor does it give uptodate info
after :reload. consider this module:
{{{
module Main where
import Prelude ()
import Control.Monad (mplus)
import qualified Control.Monad (mplus)
}}}
for which {{{:browse *Main}}} reports:
{{{
class (GHC.Base.Monad m) => Control.Monad.MonadPlus m where
...
mplus :: m a -> m a -> m a
}}}
note that Control.Monad.mplus is missing. commenting out the unqualified
import and doing :reload does not change the output, even though 'mplus'
is no longer available unqualified. after restarting ghci, the output
becomes:
{{{
class (GHC.Base.Monad m) => Control.Monad.MonadPlus m where
...
Control.Monad.mplus :: m a -> m a -> m a
}}}
if i now change the qualified import to an empty list, the output remains
unchanged, even though 'mplus' is no longer available in any form (as
restarting ghci confirms). i reclassify this as a bug.
--
Ticket URL: <http://hackage.haskell.org/trac/ghc/ticket/1617>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler_______________________________________________
Glasgow-haskell-bugs mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs