Hi,
The Left Shrinking law for MonadFix in
fptools/libraries/base/Control/Monad/Fix.hs contains a typo.
Trivial patch is attached.
Greetings,
Remi
--
Nobody can be exactly like me. Even I have trouble doing it.
--- fptools/libraries/base/Control/Monad/Fix.hs.old Sun Jul 10 22:03:51 2005
++
Good evening,
I just stumbled across a segfault caused when running the
following small program. (During an attempt to implement
single-assignment variables.)
> module Main where
>
> import Control.Concurrent
> import System.IO.Unsafe (unsafeInterleaveIO)
>
> main = do
> v <- newEmptyMVar
>
Good afternoon,
the attached program is about 7 times slower when compiled
_with_ -O using ghc 6.4. Using ghc 6.2.1 with ddata's Map gives
the same behaviour.
Happy hacking,
Remi
% make
ghc --make -no-recompMain.hs -o nor
Chasing modules from: Main.hs
Compiling Main ( Main.hs,
On Mon, Mar 21, 2005 at 09:01:19AM -, Simon Peyton-Jones wrote:
> The trouble is that instance declarations could be in *any* module. So
> at the moment GHC just reports the instances it knows about.
>
> As time goes on, it knows about more modules, so it may report more
> instances.
>
> I ag
Hi,
every once in a while, a screenshot says more than a thousand words.
And it's "global": ":i Bool" followed by ":i Int" shows exactly
the same symptom.
Groeten,
Remi
~% ghci
___ ___ _
/ _ \ /\ /\/ __(_)
/ /_\// /_/ / / | | GHC Interactive, version 6.4, for Haskell 98.
/
Hello again,
first of all, I'm not sure whether this is actually a bug-report
or a feature-request.
The three line summary is that in the following program, no
specialized version for ST s is created by at least 6.2.1,
6.4.20050304, and 6.4.20050308.
{-# OPTIONS -fno-implicit-prelude #-}
mod
e bug?
Cheers,
Remi
> | -Original Message-
> | From: [EMAIL PROTECTED]
> [mailto:glasgow-haskell-bugs-
> | [EMAIL PROTECTED] On Behalf Of Remi Turk
> | Sent: 07 March 2005 00:41
> | To: glasgow-haskell-bugs@haskell.org
> | Subject: 6.4.20050304 RULES panic from CgMonad.l
Hi,
while still trying to get Data.HashTable to work both in ST and
IO (I'll probably start complaining about optimizations not
performed once this is fixed ;), I bumped into the following
nastiness.
Comments interleaved with shell copy-paste-work.
% make clean
rm -f *.o *.hi a.out
On Mon, Feb 28, 2005 at 03:01:53AM -, Simon Peyton-Jones wrote:
> Ah, this one we fixed a few days ago. Works for me with the head.
>
> Thanks for your well-boiled-down bug reports; they are a lot faster to
> fix.
>
> Simon
Thanks, it's nice to hear that. Though I consider it a fair
deal: I
Hi,
6.4 appears to incorrectly infer some types in the attached code
when asking with :info in GHCi.
Both 6.2.1 and 6.4.20050215 "inferrings" (is there a nice english
word for that?) are added and commented out.
Greetings,
Remi
--
Nobody can be exactly like me. Even I have trouble doing it.
{-#
Hi,
while trying to modify Data.HashTable to support both IO and ST
without simply copying it, 6.4.20050215 again decided it doesn't
like me:
/tmp/test% touch *.hs
/tmp/test% /var/tmp/ghc/bin/ghc -O -c MHashTable.hs
/tmp/test% /var/tmp/ghc/bin/ghc -O --make CompatHashTable.hs
Chasing modules from
Hello again,
while trying to get HashTable to work both in IO and in ST I
hit the following probable bug in 6.4.20050215.
6.2.1 does accept it, and the #ifdeffed-out version works in
both. When the typesignature is removed 6.4 does accept it.
Cheers,
Remi
{-# OPTIONS -cpp -fglasgow-exts #-}
modu
Hi,
it's not going to cause World War III, but it does seem to be a
tiny regression since 6.2:
with an empty class, 6.4.20050215 gives:
*Main> :i EmptyClass
class EmptyClass a where-- Defined at foo.hs:1:6
^
where 6.2.1 gave:
*Main> :i EmptyClass
-- EmptyClass is
Good evening,
the following says it all:
~% /var/tmp/ghc/bin/ghci /tmp/foo.hs
___ ___ _
/ _ \ /\ /\/ __(_)
/ /_\// /_/ / / | | GHC Interactive, version 6.4.20050215, for Haskell
98.
/ /_\\/ __ / /___| | http://www.haskell.org/ghc/
\/\/ /_/\/|_| Type :? for
Hi,
the subject almost already says it. In line 767 of mk/target.mk
from ghc-6.4.20050215, make install dies because INSTALL_LIBS is
" " instead of "", causing a shell syntax error:
make[1]: Entering directory `/var/tmp/ghc-6.4.20050215/ghc'
for i in ; do \
^
[snip]
/bin/sh: -c:
On Sun, Oct 31, 2004 at 06:37:20PM +0100, Lemming wrote:
> I encountered that the implementation of 'partition' in GHC 6.2.1 fails
> on infinite lists:
>
> >partition :: (a -> Bool) -> [a] -> ([a],[a])
> >partition p xs = foldr (select p) ([],[]) xs
>
> >select p x (ts,fs) | p x = (x:ts,fs)
Hi,
not directly a bug-report, but kind of a meta-bug-question:
Is anyone interested in bug-reports about PArr, or is it a case
of "completely broken, go fix it yourself"?
I do not need it, but was playing around with it and found that
both CVS and 6.2.1 panic even on something as simple as
[: 1 |
17 matches
Mail list logo