patch applied (packages/regex-base): Make
setupscriptcompileagain after recent Cabal changes
Ian Lynagh
igloo at earth.li
Sun Sep 2 17:24:50 EDT 2007
On Sat, Sep 01, 2007 at 11:48:34PM +0100, Claus Reinke wrote:
>
> i just did a little experiment, with ghc-6.6.1. consider:
>
> -- Y.hs
> module Main where
> import Data.Time
> main = print =<< getCurrentTime
>
> now, consider this cabal package, the only purpose of which will
> be to make Y.hs compileable:
>
> -- P.cabal
> Exposed-modules: Data
> Build-Depends: base, time
>
> -- Data.hs (yes..)
> module Data(module Time) where
> import Data.Time as Time
I'm a bit confused; is this Data module necessary? If so, is its name
important? Are you proposing a new extension?
> configure, build, install, and 'ghc -package P Y.hs' seems to work.
>
> $ ghc -package P Y.hs
Why is -package P better than -package time?
Incidentally, one thing that might help is to make an empty "time"
package for people with old GHCs to install (or even to make the time
package appear empty to such people, with configurations. Except they'd
have to upgrade Cabal to support configurations first).
Thanks
Ian
More information about the Libraries
mailing list