| I'm trying to learn more about Explicit Universal 
| Quantification so I decide to run the following supposedly 
| correct code from the ghc user
| guide:
| 
| >module Dummy where
| >
| >import ST
| >
| >newtype TIM s a = TIM (ST s (Maybe a))
| >
| >runTIM :: (forall s. TIM s a) -> Maybe a
| >runTIM t = case t of {TIM l -> runST l}

This is a hopeless bug in the user manual.  Sorry about that.
It's not there any more in any case.

As you discovered, the correct way to say it is

  runTIM t = runST (case t of {TIM l -> l})

Simon

_______________________________________________
Haskell mailing list
[EMAIL PROTECTED]
http://www.haskell.org/mailman/listinfo/haskell

Reply via email to