This has now been entered as bug #8851. Track progress there if you're 
interested.

Thanks for bringing this up!
Richard

On Mar 5, 2014, at 4:34 PM, Edward Kmett <ekm...@gmail.com> wrote:

> As usual I'm the source of more headaches for Richard. ;)
> 
> -Edward
> 
> 
> On Wed, Mar 5, 2014 at 3:57 PM, Sergei Trofimovich <sly...@gmail.com> wrote:
> On Wed, 5 Mar 2014 15:40:27 -0500
> Richard Eisenberg <e...@cis.upenn.edu> wrote:
> 
> > I think those should be the same and that you've discovered a bug. What's 
> > the definition of the Parsing class?
> 
> Here it goes [1]:
> 
> class Alternative m => Parsing m where
>     ....
>     notFollowedBy :: (Monad m, Show a) => m a -> m ()
>     notFollowedBy p = try ((try p >>= unexpected . show) <|> pure ())
>     {-# INLINE notFollowedBy #-}
> 
> [1]: 
> https://github.com/ekmett/parsers/blob/master/src/Text/Parser/Combinators.hs#L230
> 
> --
> 
>   Sergei
> 
> _______________________________________________
> ghc-devs mailing list
> ghc-devs@haskell.org
> http://www.haskell.org/mailman/listinfo/ghc-devs
> 
> 

_______________________________________________
ghc-devs mailing list
ghc-devs@haskell.org
http://www.haskell.org/mailman/listinfo/ghc-devs

Reply via email to