Re: [GHC] #5007: deriving seems to ignore class context for a type family

2011-03-14 Thread GHC
#5007: deriving seems to ignore class context for a type family
+---
  Reporter:  jkff   |  Owner:  simonpj  
   
  Type:  bug| Status:  closed   
   
  Priority:  high   |  Milestone:  7.2.1
   
 Component:  Compiler (Type checker)|Version:  7.0.2
   
Resolution:  invalid|   Keywords:  type families, 
datatype contexts, type classes, deriving
  Testcase: |  Blockedby:   
   
Difficulty: | Os:  Unknown/Multiple 
   
  Blocking: |   Architecture:  Unknown/Multiple 
   
   Failure:  GHC rejects valid program  |  
+---
Changes (by simonpj):

  * status:  new = closed
  * resolution:  = invalid


Comment:

 The error message is quite right.

 Using a context on a data type declaration, as you are doing, is a mis-
 feature of Haskell.  If you read its specification carefully you'll see
 that it is practically useless. Any program using it is suspicious.
 Certainly, it has absolutely no effect on 'deriving' declarations.

 You can follow the advice in the error message and use a standalone
 deriving declaration, thus
 {{{
 {-# LANGUAGE StandaloneDeriving, FlexibleContexts, UndecidableInstances,
 TypeFamilies #-}

 module T5007 where

 class Foo a where
data Bar a :: *

 class (Show (Bar a)) = Qux a
 data Xyzzy a = Xyzzy (Bar a)

 deriving instance Show (Bar a) = Show (Xyzzy a)
 }}}

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5007#comment:2
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #5027: Remove ability to use ghc-binary

2011-03-14 Thread GHC
#5027: Remove ability to use ghc-binary
-+--
Reporter:  igloo |Owner:  
Type:  bug   |   Status:  new 
Priority:  high  |Milestone:  7.2.1   
   Component:  Compiler  |  Version:  7.0.2   
Keywords:| Testcase:  
   Blockedby:|   Difficulty:  
  Os:  Unknown/Multiple  | Blocking:  
Architecture:  Unknown/Multiple  |  Failure:  None/Unknown
-+--
 There have been a couple of cases recently where people have been using
 the `ghc-binary` package. We should either:
  * ship `binary` instead. Then people can legitimately use it, and as a
 bonus, as GHC moves to using `binary` the `Binary` instances for GHC's
 types will become available
  * Add something to GHC to allow us to ''really'' hide packages, so people
 can't use it

 We'll have to make some sort of decision about `hoopl`, too.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5027
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


[GHC] #5028: stage3 build failing with core-lint error

2011-03-14 Thread GHC
#5028: stage3 build failing with core-lint error
-+--
Reporter:  simonmar  |Owner: 
Type:  bug   |   Status:  new
Priority:  highest   |Milestone:  7.2.1  
   Component:  Compiler  |  Version:  7.1
Keywords:| Testcase: 
   Blockedby:|   Difficulty: 
  Os:  Unknown/Multiple  | Blocking: 
Architecture:  Unknown/Multiple  |  Failure:  Building GHC failed
-+--
 Sometime around 10 March 2011, the nightly build on x86-64/Linux began
 failing the stage3 build with the following core-lint error:

 {{{
 *** Core Lint errors : in result of CorePrep ***
 no location info:
 [RHS of ds4_s1PqX :: (FastString.FastString,
   FastString.FastString)]
 Occurrence of a dead Id wild3_s1S4x
 *** Offending Program ***
 notHappyAtAll_r3z1 :: forall t_a5OH. t_a5OH
 [GblId, Str=DmdType b]
 notHappyAtAll_r3z1 =
   \ (@ t_a5OH) -
 case GHC.Base.unpackCString# Internal Happy error
 of sat_s1Q0Y { __DEFAULT -
 GHC.Err.error @ t_a5OH sat_s1Q0Y
 }

 etc.
 }}}

 while building `compiler/stage3/build/Parser.hs`.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5028
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5028: stage3 build failing with core-lint error

2011-03-14 Thread GHC
#5028: stage3 build failing with core-lint error
-+--
Reporter:  simonmar  |Owner: 
Type:  bug   |   Status:  new
Priority:  highest   |Milestone:  7.2.1  
   Component:  Compiler  |  Version:  7.1
Keywords:| Testcase: 
   Blockedby:|   Difficulty: 
  Os:  Unknown/Multiple  | Blocking: 
Architecture:  Unknown/Multiple  |  Failure:  Building GHC failed
-+--
Changes (by simonpj):

 * cc: batterseapower (added)


Comment:

 Max, might you look at this, since it's your patch that's implicated?

 Simon

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5028#comment:2
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5017: Stage 1 core lint error: compiler/utils/Util.lhs

2011-03-14 Thread GHC
#5017: Stage 1 core lint error: compiler/utils/Util.lhs
--+-
  Reporter:  altaic   |  Owner:
  Type:  bug  | Status:  closed
  Priority:  normal   |  Milestone:
 Component:  Compiler |Version:  7.1   
Resolution:  duplicate|   Keywords:
  Testcase:   |  Blockedby:
Difficulty:   | Os:  MacOS X   
  Blocking:   |   Architecture:  x86_64 (amd64)
   Failure:  Building GHC failed  |  
--+-
Changes (by simonpj):

  * status:  new = closed
  * resolution:  = duplicate


Comment:

 Appears to be a dup of #5028 (which was reported later, but may be easier
 to reproduce).

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5017#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5023: program exits at runtime with 'unimplemented/strange closure type' error

2011-03-14 Thread GHC
#5023: program exits at runtime with 'unimplemented/strange closure type' error
---+
Reporter:  bfbarakat   |Owner:  
Type:  bug |   Status:  infoneeded  
Priority:  normal  |Milestone:  
   Component:  Compiler|  Version:  6.12.3  
Keywords:  | Testcase:  
   Blockedby:  |   Difficulty:  
  Os:  MacOS X | Blocking:  
Architecture:  x86_64 (amd64)  |  Failure:  None/Unknown
---+
Changes (by simonmar):

  * status:  new = infoneeded


Comment:

 Could you send us the data files too?  Basically we need everything
 required to reproduce the problem here.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5023#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5025: GHC should support -x objective-c

2011-03-14 Thread GHC
#5025: GHC should support -x objective-c
-+--
Reporter:  guest |Owner: 
Type:  feature request   |   Status:  new
Priority:  high  |Milestone:  7.2.1  
   Component:  Compiler  |  Version:  7.0.2  
Keywords:  objective-c   | Testcase: 
   Blockedby:|   Difficulty:  Easy (less than 1 hour)
  Os:  MacOS X   | Blocking: 
Architecture:  Unknown/Multiple  |  Failure:  None/Unknown   
-+--
Changes (by simonmar):

  * priority:  normal = high
  * difficulty:  = Easy (less than 1 hour)
  * milestone:  = 7.2.1


-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5025#comment:1
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5028: stage3 build failing with core-lint error

2011-03-14 Thread GHC
#5028: stage3 build failing with core-lint error
-+--
Reporter:  simonmar  |Owner: 
Type:  bug   |   Status:  new
Priority:  highest   |Milestone:  7.2.1  
   Component:  Compiler  |  Version:  7.1
Keywords:| Testcase: 
   Blockedby:|   Difficulty: 
  Os:  Unknown/Multiple  | Blocking: 
Architecture:  Unknown/Multiple  |  Failure:  Building GHC failed
-+--
Changes (by altaic):

 * cc: william.knop.nospam@… (added)


Comment:

 I confirmed that the core lint error from #5017 disappears after unpulling
 the aforementioned patch.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5028#comment:4
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5028: stage3 build failing with core-lint error

2011-03-14 Thread GHC
#5028: stage3 build failing with core-lint error
-+--
Reporter:  simonmar  |Owner: 
Type:  bug   |   Status:  new
Priority:  highest   |Milestone:  7.2.1  
   Component:  Compiler  |  Version:  7.1
Keywords:| Testcase: 
   Blockedby:|   Difficulty: 
  Os:  Unknown/Multiple  | Blocking: 
Architecture:  Unknown/Multiple  |  Failure:  Building GHC failed
-+--

Comment(by batterseapower):

 It looks like this is because OccAnal implements binder-swapping. So if
 you have this in the input:

 {{{
 case x of y { p - e[x] }
 }}}

 Then you get this in the output:

 {{{
 case x of y { p - let x = y in e }
 }}}

 This makes y live, and if it was dead to begin with this causes a lint
 error. I had absolutely no idea OccAnal was playing games like this!

 My first thought was that perhaps OccAnal should be setting the OccInfo on
 the y in it's manufactured binding to e.g. NoOccInfo. This would
 certainly make the error go away, but it is not in the spirit of OccAnal -
 as far as I can tell, OccAnal guarantees that *binders* will have the
 right OccInfo, but relies on the simplifier to ensure that the
 *occurrences* are up-to-date.

 The obvious thing to do is paramaterise OccAnal so we can prevent it from
 implementing binder-swap when we use it just before CorePrep. I'm working
 on a patch to that effect.

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5028#comment:5
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5028: stage3 build failing with core-lint error

2011-03-14 Thread GHC
#5028: stage3 build failing with core-lint error
-+--
Reporter:  simonmar  |Owner: 
Type:  bug   |   Status:  new
Priority:  highest   |Milestone:  7.2.1  
   Component:  Compiler  |  Version:  7.1
Keywords:| Testcase: 
   Blockedby:|   Difficulty: 
  Os:  Unknown/Multiple  | Blocking: 
Architecture:  Unknown/Multiple  |  Failure:  Building GHC failed
-+--

Comment(by batterseapower):

 (Unvalidated) patch attached. A stage 3 build goes through OK with this
 -dcore-lint with this patch applied.

 Does this look good to you, Simon? Or do you think there is a better
 approach?

-- 
Ticket URL: http://hackage.haskell.org/trac/ghc/ticket/5028#comment:6
GHC http://www.haskell.org/ghc/
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: Data.ByteString.Lazy.ByteString vs Data.ByteString.Lazy.Internal.ByteString

2011-03-14 Thread Christian Maeder
Am 14.03.2011 06:26, schrieb C K Kashyap:
 Looks like a job for Data.Binary.
 
  I'd like to use it with just the libraries that are part of the
 platform
 
 
 I forgot to mention, Data.Binary does not seem to be in the platform.

Right, it is not in the platform, but I would recommend to install those
packages that you find useful (and vote for packages to be included into
later versions of the platform.)

Interestingly, there is a hidden package ghc-binary-0.5.0.2, which
almost looks like binary-0.5.0.2.

Maybe ghc developers and platform maintainers could comment on any
differences. If there are none you could simple ghc-pkg expose
ghc-binary. For future versions of ghc and the platform a single
ghc-binary or binary version would be better.

Cheers Christian


___
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-users


Re: [Haskell-cafe] Data.ByteString.Lazy.ByteString vs Data.ByteString.Lazy.Internal.ByteString

2011-03-14 Thread Antoine Latter
The ghc-binary package is used internal to GHC, and isn't gauranteed to be
present from one version to the next, nor do I expect the GHC team to
promise it will have a stable interface.

You'd really be better of instaling the package binary, or something
similar.
On Mar 14, 2011 5:34 AM, Christian Maeder christian.mae...@dfki.de
wrote:
___
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-users


testsuite missing was: Re: ANNOUNCE: GHC version 7.0.2

2011-03-14 Thread Christian Maeder
Why is the file still not being updated?
http://www.haskell.org/ghc/dist/7.0.2/testsuite-7.0.2.tar.bz2

C.

Am 10.03.2011 03:22, schrieb Jens Petersen:
 On 4 March 2011 23:14, Christian Maeder christian.mae...@dfki.de wrote:
 http://www.haskell.org/ghc/dist/7.0.2/testsuite-7.0.2.tar.bz2

 This archive does not seem to have the actual tests inside the testsuite
 subdirectory. At least the README is identical to the top-level one.
 
 Not just the readme, but most of the files actually!
 
 $ tar jxf ghc-7.0.2-src.tar.bz
 $ tar jxf testsuite-7.0.2.tar.bz
 $ mv ghc-7.0.2/testsuite testsuite-7.0.2
 $ diff -sr ghc-7.0.2 testsuite-7.0.2 | grep are identical$ | wc -l
 1193
 
 A week has passed now - can we please have a fixed
 testsuite-7.0.2.tar.bz2? :)
 
 Thanks, Jens
 

___
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-users


Re: Data.ByteString.Lazy.ByteString vs Data.ByteString.Lazy.Internal.ByteString

2011-03-14 Thread Simon Marlow

On 14/03/2011 10:33, Christian Maeder wrote:

Am 14.03.2011 06:26, schrieb C K Kashyap:

 Looks like a job for Data.Binary.

   I'd like to use it with just the libraries that are part of the
 platform


I forgot to mention, Data.Binary does not seem to be in the platform.


Right, it is not in the platform, but I would recommend to install those
packages that you find useful (and vote for packages to be included into
later versions of the platform.)

Interestingly, there is a hidden package ghc-binary-0.5.0.2, which
almost looks like binary-0.5.0.2.

Maybe ghc developers and platform maintainers could comment on any
differences. If there are none you could simple ghc-pkg expose
ghc-binary. For future versions of ghc and the platform a single
ghc-binary or binary version would be better.


You shouldn't use ghc-binary.  It is indeed the same as binary, and is 
required because GHC uses it internally, but binary is not a platform 
package so we renamed it to ghc-binary and set it to be hidden by default.


Cheers,
Simon

___
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-users


Re: GHC build error: cannot satisfy -package ghc-7.1.20110217

2011-03-14 Thread Simon Marlow

On 10/03/2011 02:44, Dave Bayer wrote:

I saw this same error, building GHC 7.0.2 from source on OS X.

My builds are completely scripted, so I could attempt any experiments
that would help. I always expect issues with major (here, 6 =  7)
version changes; here all issues surrounded cabal-install in one way
or another.

My issues went away when I compiled GHC 7.0.2 using a bootstrap copy
of GHC 7.0.2 (rather than from GHC 6.12.3). made the new install the
active GHC, and then ran ./bootstrap.sh --global to install
cabal-install-0.10.2. Either the change from cabal-install-0.10.0
helped (I couldn't track down release notes) or there is a subtle
difference in a GHC 7.0.2 compiled from GHC 6.12.3, that gets exposed
when one tries to install cabal-install.


Can you tell us exactly which versions of GHC and Cabal you were using 
when the build failed?  We should be able to reproduce the problem from 
that.


Cheers,
Simon



I still can't use cabal-install on one copy of 7.0.2 to install to
another copy of 7.0.2, but it looks like something I'll manage to
sort out without help.

I use PREFIX to localize the installation to e.g.
/usr/local/ghc-7.0.2c. This requires that my script edits
bootstrap.sh, as there's no way to change PREFIX from outside in
--global mode.

On Mar 8, 2011, at 9:44 AM, Simon Marlow wrote:


I don't know what might case this I'm afraid.  Is it reproducible
from a completely clean tree? (i.e. make maintainer-clean first).

Cheers, Simon





___
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-users


Linker error

2011-03-14 Thread Luca Ciciriello
Hi All.
I've just installed the new Haskell platform (2011.2.0.0) on my MacOS X 10.6.6 
with Xcode 4

Now the problem is that when I try to build my Haskel programs I receive the 
linker error:

Linking lexer ...
ld: library not found for -lcrt1.10.5.o
collect2: ld returned 1 exit status

Any idea?

Thanks in advance.

Luca
___
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-users


Re: Linker error

2011-03-14 Thread Don Stewart
There's an open bug ticket about XCode 4 not linking properly (I think
due to the new dtrace support making GHC builds tied to a specific
XCode version).

Can you downgrade to XCode 3 in the meantime?

On Mon, Mar 14, 2011 at 8:43 AM, Luca Ciciriello
luca_cicirie...@hotmail.com wrote:
 Hi All.
 I've just installed the new Haskell platform (2011.2.0.0) on my MacOS X 
 10.6.6 with Xcode 4

 Now the problem is that when I try to build my Haskel programs I receive the 
 linker error:

 Linking lexer ...
 ld: library not found for -lcrt1.10.5.o
 collect2: ld returned 1 exit status

 Any idea?

 Thanks in advance.

 Luca
 ___
 Glasgow-haskell-users mailing list
 Glasgow-haskell-users@haskell.org
 http://www.haskell.org/mailman/listinfo/glasgow-haskell-users


___
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-users


Re: Linker error

2011-03-14 Thread David Peixotto
The relevant GHC ticket is: http://hackage.haskell.org/trac/ghc/ticket/5011, 
which it seems has already been fixed in HEAD.

You can also check this thread on Haskell-Cafe which contains a few workarounds 
for this problem: 
http://www.haskell.org/pipermail/haskell-cafe/2011-March/090051.html

-Dave

On Mar 14, 2011, at 10:55 AM, Don Stewart wrote:

 There's an open bug ticket about XCode 4 not linking properly (I think
 due to the new dtrace support making GHC builds tied to a specific
 XCode version).
 
 Can you downgrade to XCode 3 in the meantime?
 
 On Mon, Mar 14, 2011 at 8:43 AM, Luca Ciciriello
 luca_cicirie...@hotmail.com wrote:
 Hi All.
 I've just installed the new Haskell platform (2011.2.0.0) on my MacOS X 
 10.6.6 with Xcode 4
 
 Now the problem is that when I try to build my Haskel programs I receive the 
 linker error:
 
 Linking lexer ...
 ld: library not found for -lcrt1.10.5.o
 collect2: ld returned 1 exit status
 
 Any idea?
 
 Thanks in advance.
 
 Luca
 ___
 Glasgow-haskell-users mailing list
 Glasgow-haskell-users@haskell.org
 http://www.haskell.org/mailman/listinfo/glasgow-haskell-users
 
 
 ___
 Glasgow-haskell-users mailing list
 Glasgow-haskell-users@haskell.org
 http://www.haskell.org/mailman/listinfo/glasgow-haskell-users
 


___
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-users


Re: hoogling GHC

2011-03-14 Thread Ranjit Jhala
Hi Neil -- 

Is there a command line option that allows one to change the default prefix for 
the 
URL returned by searches?

For example, I managed to get a local hoogle server to index over ghc.foo but a 
query dfun returned the (dead) link

   
http://hackage.haskell.org/packages/archive/ghc/latest/doc/html/Id.html#v:isDFunId

presumably using the default prefix for hackage.haskell.org/... 
Instead, by manually tweaking the prefix to

   
http://www.haskell.org/ghc/docs/7.0.1/html/libraries/ghc-7.0.1/Id.html#v:isDFunId

I get something useful. Is there some way to rig the .txt -- .foo conversion 
to use
a manually supplied prefix?

Thanks for your help with this!

Ranjit.

On Mar 9, 2011, at 1:59 PM, Neil Mitchell wrote:

 Hi Ranjit,
 
 It sounds like you've got quite far. Sadly the manual is a bit out of
 date with respect to generating databases, but generally you need to
 produce ghc.txt on your own (using tools such as GHC's make system),
 then you can do:
 
 hoogle convert ghc.txt default.hoo
 
 Then you can run the local server with:
 
 hoogle server --databases=.
 
 That will find databases from the current directory, and serve them.
 Alternatively, if you put ghc.hoo (or default.hoo) in
 $DATADIR/databases it will pick them up automatically (where $DATADIR
 is whatever Cabal configured it to be). If you name the database as
 default.hoo it will be searched by default, if you name it ghc.hoo
 then foo +ghc will search for foo in the GHC database.
 
 If a copy of ghc.txt was publicly available somewhere (and updated on
 some schedule), I'd be happy to make the official Hoogle server search
 it. Usually I just grab databases off Hackage, but I'll happily make
 an exception for GHC.
 
 Thanks, Neil
 
 On Sun, Mar 6, 2011 at 7:52 AM, Malcolm Wallace malcolm.wall...@me.com 
 wrote:
 The final stumbling block is getting the local webserver (hoogle server)
 to also search the above database. I'm sure there must be some simple way
 I
 can pass the name of the database as an argument when I boot up the
 server,
 but I can't seem to find it...
 
 Have you found the various versions of the web deployment procedure yet?
 
 deploy.txt:  instructions to follow manually (seems to be up-to-date)
 deploy.sh:   a shell script version to run locally (may be old)
 Deploy.hs:   a haskell version to run remotely (may also be old)
 
 Obviously those scripts are tailored to the official installation, but there
 are some clues in there, for instance the steps
 
cabal configure --datadir=/srv/web/haskell.org/hoogle/
 --datasubdir=datadir -O2
 
 and
 
Upload datadir/resources to /srv/web/haskell.org/hoogle/datadir/resources
Upload datadir/databases/* to
 /srv/web/haskell.org/hoogle/datadir/databases
 
 Regards,
Malcolm
 
 ___
 Glasgow-haskell-users mailing list
 Glasgow-haskell-users@haskell.org
 http://www.haskell.org/mailman/listinfo/glasgow-haskell-users
 


___
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-users


Re: hoogling GHC

2011-03-14 Thread Neil Mitchell
Hi Ranjit,

 Is there a command line option that allows one to change the default prefix 
 for the
 URL returned by searches?

No command line option, but you can change the .txt file itself by doing:

@url http://www.haskell.org/ghc/docs/7.0.1/html/libraries/ghc-7.0.1/
@package ghc

That should cause all the URL's in the GHC package that aren't
explicit to have the above URL prepended to them. If there's demand, I
can add a flag.

Thanks, Neil


 On Mar 9, 2011, at 1:59 PM, Neil Mitchell wrote:

 Hi Ranjit,

 It sounds like you've got quite far. Sadly the manual is a bit out of
 date with respect to generating databases, but generally you need to
 produce ghc.txt on your own (using tools such as GHC's make system),
 then you can do:

 hoogle convert ghc.txt default.hoo

 Then you can run the local server with:

 hoogle server --databases=.

 That will find databases from the current directory, and serve them.
 Alternatively, if you put ghc.hoo (or default.hoo) in
 $DATADIR/databases it will pick them up automatically (where $DATADIR
 is whatever Cabal configured it to be). If you name the database as
 default.hoo it will be searched by default, if you name it ghc.hoo
 then foo +ghc will search for foo in the GHC database.

 If a copy of ghc.txt was publicly available somewhere (and updated on
 some schedule), I'd be happy to make the official Hoogle server search
 it. Usually I just grab databases off Hackage, but I'll happily make
 an exception for GHC.

 Thanks, Neil

 On Sun, Mar 6, 2011 at 7:52 AM, Malcolm Wallace malcolm.wall...@me.com 
 wrote:
 The final stumbling block is getting the local webserver (hoogle server)
 to also search the above database. I'm sure there must be some simple way
 I
 can pass the name of the database as an argument when I boot up the
 server,
 but I can't seem to find it...

 Have you found the various versions of the web deployment procedure yet?

 deploy.txt:  instructions to follow manually (seems to be up-to-date)
 deploy.sh:   a shell script version to run locally (may be old)
 Deploy.hs:   a haskell version to run remotely (may also be old)

 Obviously those scripts are tailored to the official installation, but there
 are some clues in there, for instance the steps

    cabal configure --datadir=/srv/web/haskell.org/hoogle/
 --datasubdir=datadir -O2

 and

    Upload datadir/resources to /srv/web/haskell.org/hoogle/datadir/resources
    Upload datadir/databases/* to
 /srv/web/haskell.org/hoogle/datadir/databases

 Regards,
    Malcolm

 ___
 Glasgow-haskell-users mailing list
 Glasgow-haskell-users@haskell.org
 http://www.haskell.org/mailman/listinfo/glasgow-haskell-users




___
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-users


[Haskell] ICFP 2011 Deadline Extension

2011-03-14 Thread Wouter Swierstra
=

 ICFP 2011: International Conference on Functional Programming

http://www.icfpconference.org/icfp2011

=

On behalf of the Program Committee of ICFP 2011, I would like to
announce a deadline extension for authors affected by the recent
earthquake in Japan. The Program Committee will accept titles and
abstracts until Monday 4 April at 23:59, and full submissions until
Thursday 7 April at 23:59 from those authors affected by the
earthquake. Our thoughts go out to the victims of this tragedy.

  Wouter Swierstra
  ICFP Publicity Chair

___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell


[arch-haskell] AUR Out-of-date Notification for haskell-alsa-core

2011-03-14 Thread AUR Feedback
Your package haskell-alsa-core has been flagged out of date by cgirard
[1]. You may view your package at:
http://aur.archlinux.org/packages.php?ID=41100

[1] - http://aur.archlinux.org/account.php?Action=AccountInfoID=16599


___
arch-haskell mailing list
arch-hask...@haskell.org
http://www.haskell.org/mailman/listinfo/arch-haskell


[arch-haskell] AUR Comment for haskell-alsa-core

2011-03-14 Thread AUR Feedback
from http://aur.archlinux.org/packages.php?ID=41100
cgirard wrote:

This package need to be updated following the ghc update.

---
If you no longer wish to receive notifications about this package,
please go the the above package page and click the UnNotify button.


___
arch-haskell mailing list
arch-hask...@haskell.org
http://www.haskell.org/mailman/listinfo/arch-haskell


[Haskell] LOPSTR 2011 - Last CFP

2011-03-14 Thread German Vidal

News:

- Invited speakers:
 * John Gallagher (Roskilde University, Denmark)
 * Fritz Henglein (University of Copenhagen, Denmark)
 * Vitaly Lagoon (Cadence Design Systems, Boston, USA)

- Springer accepted to publish the post-proceedings
 in the Lecture Notes in Computer Science series.

- Submission deadlines approaching:
 * Paper submission: March 27,  2011
 * Extended abstract submission: April 3, 2011



 Call for papers
  21th International Symposium on
  Logic-Based Program Synthesis and Transformation
LOPSTR 2011

http://users.dsic.upv.es/~lopstr11/
   Odense, Denmark, July 18-20, 2011
(co-located with PPDP 2011, AAIP 2011 and WFLP 2011)



Objectives:

The aim of the LOPSTR series is to stimulate and promote international
research and collaboration on logic-based program development. LOPSTR
is open to contributions in logic-based program development in any
language paradigm. LOPSTR has a reputation for being a lively,
friendly forum for presenting and discussing work in progress. Formal
proceedings are produced only after the symposium so that authors can
incorporate this feedback in the published papers.

The 21st International Symposium on Logic-based Program Synthesis and
Transformation (LOPSTR 2011) will be held in Odense, Denmark; previous
symposia were held in Hagenberg, Coimbra, Valencia, Lyngby, Venice,
London, Verona, Uppsala, Madrid, Paphos, London, Venice, Manchester,
Leuven, Stockholm, Arnhem, Pisa, Louvain-la-Neuve, and Manchester (you
might have a look at the contents of past LOPSTR symposia). LOPSTR
2011 will be co-located with PPDP 2011 (International ACM SIGPLAN
Symposium on Principles and Practice of Declarative Programming).


Topics:

Topics of interest cover all aspects of logic-based program development,
all stages of the software life cycle, and issues of both programming-
in-the-small and programming-in-the-large. Papers describing
applications in these areas are especially welcome. Contributions are
welcome on all aspects of logic-based program development, including,
but not limited to:

- specification
- synthesis
- verification
- transformation
- analysis
- optimisation
- specialization
- partial evaluation
- inversion
- composition
- program/model manipulation
- certification
- security
- transformational techniques in SE
- applications and tools

Survey papers, that present some aspect of the above topics from a new
perspective, and application  papers, that describe experience with
industrial applications, are also welcome. Papers must describe
original work, be written and presented  in English, and must not
substantially overlap with papers that have been published or that are
simultaneously submitted to a journal or a conference with refereed
proceedings. Work that already appeared in unpublished or informally
published workshops proceedings may be submitted.

Following past editions, the formal post-conference proceedings will
be published by Springer in the Lecture Notes in Computer Science (LNCS)
series.


IMPORTANT DATES AND SUBMISSION GUIDELINES:


- Paper submission: March 27,  2011
- Extended abstract submission: April 3, 2011
- Notification (for pre-proceedings): May 16, 2011
- Camera-ready (for pre-proceedings): June 12, 2011
- Symposium: July 18-20, 2011


Submissions can either be (short) extended abstracts or (full) papers
whose length should not exceed 9 and 15 pages (including references),
respectively. Submissions must be formatted in the Lecture Notes in
Computer Science style (excluding well-marked appendices not intended
for publication). Referees are not required to read the appendices,
and thus papers should be intelligible without them. Short papers may
describe work-in-progress or tool demonstrations.

Both short and full papers can be accepted for presentation at the
symposium and will then appear in the LOPSTR 2011
pre-proceedings. Full papers can also be immediately accepted for
publication in the formal proceedings to be published by Springer
in the LNCS series. In addition, after the symposium, the programme
committee will select further short or full papers presented
in LOPSTR 2011 to be considered for formal publication. These authors
will be invited to revise and/or extend their submissions in the
light of the feedback solicited at the symposium. Then after another
round of reviewing, these revised papers can also be published in the
formal proceedings.


Invited speakers:

- John Gallagher, Roskilde University, Denmark  
- Fritz Henglein, University of Copenhagen, Denmark  (shared with PPDP)
- Vitaly Lagoon, Cadence Design Systems, Boston, USA (shared with PPDP)


Program Committee:

Elvira Albert (Complutense University of Madrid, Spain)
Malgorzata Biernacka (University of Wroclaw , Poland)
Manuel Carro (Technical University of 

Re: [arch-haskell] Transitive version bump/update of dependents?

2011-03-14 Thread Peter Simons
Hi Leif,

  Is there a tool for bumping the version numbers / checking for newer
  versions of all the packages that transitively depend on those that
  would need to be rebuilt?

my repository https://github.com/peti/arch-haskell contains the
program scripts/reverse-dependencies.hs, which can list all users of a
given package. I use it to determine which packages need their $pkgrel
bumped after an update.


  Or do we even need to worry about that right now [...]?

Yes, I think we do. The package 'haskell-utility-ht' has already been
re-built with GHC 7.0.2, and it has been uploaded to the binary
repository. If that package is updated, its users need their $pkgrel
bumped.

Take care,
Peter


___
arch-haskell mailing list
arch-hask...@haskell.org
http://www.haskell.org/mailman/listinfo/arch-haskell


Re: [Haskell] Haskell mail server fail?

2011-03-14 Thread Simon Marlow

On 09/03/2011 14:40, Kenneth Hoste wrote:


Since last week, I'm not receiving any mails from the Haskell mailing
lists (haskell@, haskell-cafe@ and beginners@) at work.
(I'm temporarily using my GMail account now)

I checked with the guys in our IT department what's going on, and it
seems like the Haskell mail server lambda.haskell.org is not
(re)configured as it should.

The relevant log message on our side is:

reject: RCPT from lambda.haskell.org[78.46.100.180]: 504 5.5.2lambda:
Helo command rejected: need fully-qualified hostname;
from=haskell-boun...@haskell.org  to=kenneth.ho...@ugent.be
proto=ESMTP helo=lambda

Apparently lambda should be responding with helo=lambda.haskell.org
(or somesuch) in order to make the mails pass through on our end. We
have a pretty strict anti-SPAM policy, and I was told that not using a
fully qualified hostname as helo response is a common characteristic of
spam servers.

Can someone look into this?


Ian Lynagh has just fixed this on the server.  Please let us know at 
listname-ow...@haskell.org (e.g. haskell-ow...@haskell.org) if you 
encounter any further problems.


Cheers,
Simon

___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell


[Haskell] ANN: craftwerk-0.1, craftwerk-cairo-0.1, craftwerk-gtk-0.1

2011-03-14 Thread Malte Harder
Dear all,

I just released the first version of the Craftwerk graphics library for
2d vector graphics. Craftwerk is intended to act as an abstract
interface to different backend drivers. The library itself has a TikZ
(http://sourceforge.net/projects/pgf) driver builtin to output vector
graphics for use in LaTeX documents. The craftwerk-cairo library
supplies a Cairo output function to the library. The aim is to support
these two backends in a seamless manner such that graphics created with
either backend are not or nearly not distinguishable.

The third package (craftwerk-gtk) contains convenience functions to
display graphics created with craftwerk directly in a Gtk window,
including the basic zooming, PDF  TikZ export via a file chooser
dialog. It also allows to create a simple user interface that passes
options to the rendering function.

The feature support is rather rudimentary at the moment, but for current
Cairo users most features should be already available from within the
craftwerk API. The aim is to support more high level functions like TikZ
offers.

The project started when I realized that I need to prepare a lot of
visualizations at university twice, once for display and once for print.
I hope that this library proves to be useful for people with similar
tasks. A great thing would be if the Chart library allows to plug
another backend in. I haven't really looked into that, but this would
allow me to leave Gnuplot and R behind for most purposes and at the same
time get higher quality output that is better integrable.

I started learning Haskell only half a year ago and this is my first
real project. So far I have to say that I enjoy it very much. Therefore,
if you find some weird constructions or have any comments about the
design of the library, I'm looking forward for any feedback!

The source repository can be found under:
https://github.com/mahrz/Craftwerk

and packages here:
http://hackage.haskell.org/package/craftwerk-0.1
http://hackage.haskell.org/package/craftwerk-cairo-0.1
http://hackage.haskell.org/package/craftwerk-gtk-0.1

Best,
Malte

--
Malte Harder
malte.har...@gmail.com



___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell


Re: [Haskell] ANN: craftwerk-0.1, craftwerk-cairo-0.1, craftwerk-gtk-0.1

2011-03-14 Thread Vo Minh Thu
2011/3/14 Malte Harder malte.har...@googlemail.com:
 Dear all,

 I just released the first version of the Craftwerk graphics library for
 2d vector graphics. Craftwerk is intended to act as an abstract
 interface to different backend drivers. The library itself has a TikZ
 (http://sourceforge.net/projects/pgf) driver builtin to output vector
 graphics for use in LaTeX documents. The craftwerk-cairo library
 supplies a Cairo output function to the library. The aim is to support
 these two backends in a seamless manner such that graphics created with
 either backend are not or nearly not distinguishable.

 The third package (craftwerk-gtk) contains convenience functions to
 display graphics created with craftwerk directly in a Gtk window,
 including the basic zooming, PDF  TikZ export via a file chooser
 dialog. It also allows to create a simple user interface that passes
 options to the rendering function.

 The feature support is rather rudimentary at the moment, but for current
 Cairo users most features should be already available from within the
 craftwerk API. The aim is to support more high level functions like TikZ
 offers.

 The project started when I realized that I need to prepare a lot of
 visualizations at university twice, once for display and once for print.
 I hope that this library proves to be useful for people with similar
 tasks. A great thing would be if the Chart library allows to plug
 another backend in. I haven't really looked into that, but this would
 allow me to leave Gnuplot and R behind for most purposes and at the same
 time get higher quality output that is better integrable.

 I started learning Haskell only half a year ago and this is my first
 real project. So far I have to say that I enjoy it very much. Therefore,
 if you find some weird constructions or have any comments about the
 design of the library, I'm looking forward for any feedback!

 The source repository can be found under:
 https://github.com/mahrz/Craftwerk

 and packages here:
 http://hackage.haskell.org/package/craftwerk-0.1
 http://hackage.haskell.org/package/craftwerk-cairo-0.1
 http://hackage.haskell.org/package/craftwerk-gtk-0.1

Hi Malte,

Your project sounds very good (I will unfortunately not have time to
look at it carefully before some time).

I guess you know about reddit, anyway there is a thread about your
library there: 
http://www.reddit.com/r/haskell/comments/g3xp1/craftwerk_a_highlevel_and_easy_to_use_graphics/

Could you please as suggest one comment include some screenshots (even
better with some code next to them) on the homepage?

Thanks for making the code available on both github and hackage!
Thu

___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell


Re: [Haskell-cafe] writing to a fifo when the reader stops reading

2011-03-14 Thread Brandon S Allbery KF8NH
-BEGIN PGP SIGNED MESSAGE-
Hash: SHA1

On 3/13/11 03:16 , bri...@aracnet.com wrote:
 ghc: fdWriteBuf: resource vanished (Broken pipe)
 
 which make sense, sort of.  I write a value, let's say 10, and the
 reader reads it.  It's the last value so it closes the fifo.
 
 Now there's nothing reading, so when I get to threadWaitWrite, I would
 expect the program to wait, just as it does when it starts up and there
 is no reader.

FIFOs don't work that way; like a regular pipe, once all readers go away it
doesn't work any more.  You need to open it read-write initially to keep a
reader around.  Haskell has no control over this:  it's how they're defined
to work.

In general, trying to use a FIFO like an AF_UNIX socket is a mistake.

- -- 
brandon s. allbery [linux,solaris,freebsd,perl]allber...@gmail.com
system administrator  [openafs,heimdal,too many hats]kf8nh
-BEGIN PGP SIGNATURE-
Version: GnuPG v1.4.11 (Darwin)
Comment: Using GnuPG with Mozilla - http://enigmail.mozdev.org/

iEYEARECAAYFAk19tqkACgkQIn7hlCsL25VxGwCgsInAy4YJhOA2Ca/tQTRd0Cjs
NmAAn2hjqtQm0/eZXVoLM8GMCMv+yxR4
=SDd8
-END PGP SIGNATURE-

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] [Haskell] Linker flags for foreign export.

2011-03-14 Thread Max Bolingbroke
On 13 March 2011 22:02, Jason Dusek jason.du...@gmail.com wrote:
  Is there any case in which the empty string would be unsafe?

AFAIK this stuff is only used to setup the +RTS options and some of
the stuff in System.Environment. I think that the contents of the
program name will only cause problems if some code that uses
getProgName chokes on the empty string.

Cheers,
Max

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Data.ByteString.Lazy.ByteString vs Data.ByteString.Lazy.Internal.ByteString

2011-03-14 Thread Christian Maeder
Am 14.03.2011 06:26, schrieb C K Kashyap:
 Looks like a job for Data.Binary.
 
  I'd like to use it with just the libraries that are part of the
 platform
 
 
 I forgot to mention, Data.Binary does not seem to be in the platform.

Right, it is not in the platform, but I would recommend to install those
packages that you find useful (and vote for packages to be included into
later versions of the platform.)

Interestingly, there is a hidden package ghc-binary-0.5.0.2, which
almost looks like binary-0.5.0.2.

Maybe ghc developers and platform maintainers could comment on any
differences. If there are none you could simple ghc-pkg expose
ghc-binary. For future versions of ghc and the platform a single
ghc-binary or binary version would be better.

Cheers Christian


___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[Haskell-cafe] ICFP 2011 Deadline Extension

2011-03-14 Thread Wouter Swierstra
=

 ICFP 2011: International Conference on Functional Programming

http://www.icfpconference.org/icfp2011

=

On behalf of the Program Committee of ICFP 2011, I would like to
announce a deadline extension for authors affected by the recent
earthquake in Japan. The Program Committee will accept titles and
abstracts until Monday 4 April at 23:59, and full submissions until
Thursday 7 April at 23:59 from those authors affected by the
earthquake. Our thoughts go out to the victims of this tragedy.

  Wouter Swierstra
  ICFP Publicity Chair

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] ANN: unordered-containers - a new, faster hashing-based containers library

2011-03-14 Thread Malcolm Wallace


On 22 Feb 2011, at 22:21, Bryan O'Sullivan wrote:


for some code that's (b) faster than anything else currently available


I look forward to seeing some benchmarks against libraries other than  
containers, such as AVL trees, bytestring-trie, hamtmap, list-trie,  
etc.  Good comparisons of different API-usage patterns are hard to  
come by.


Regards,
Malcolm

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Data.ByteString.Lazy.ByteString vs Data.ByteString.Lazy.Internal.ByteString

2011-03-14 Thread Antoine Latter
The ghc-binary package is used internal to GHC, and isn't gauranteed to be
present from one version to the next, nor do I expect the GHC team to
promise it will have a stable interface.

You'd really be better of instaling the package binary, or something
similar.
On Mar 14, 2011 5:34 AM, Christian Maeder christian.mae...@dfki.de
wrote:
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Some quick experiments with GHC 7.0.2 in Intel's Manycore Testing Lab (32 cores)

2011-03-14 Thread Simon Marlow

Hi José,

On 11/03/2011 14:16, José Pedro Magalhães wrote:


I've played a bit with Intel's Manycore Testing Lab
(http://software.intel.com/en-us/articles/intel-many-core-testing-lab/).
Part of the agreement to use it requires that you report back your
experiences, which I did in an Intel forum post
(http://software.intel.com/en-us/forums/showthread.php?t=81396). I
thought this could be interesting to the Haskell community in general as
well, so I'm reposting here, and pasting the text below for convenience.
I've replaced the images with links.


Is it possible for you to make the code for your benchmarks available? 
I'd be interested in analysing the results further.


In our testing I've been able to achieve speedups over 20 on 24 cores 
with GHC 7.0.2, so there should be no reason in principle that you 
couldn't achieve similar results for obviously parallel problems, which 
yours seem to be.  Some tweaking of GC parameters might be necessary: 
e.g. I've found that +RTS -A1m helps if your L2 caches are large enough. 
 A good starting point for profiling is ThreadScope, which will tell 
you if the program is really trying to use all the cores or not.


Cheers,
Simon




Cheers,
Pedro

As per the agreement with Intel, I am reporting my experiences with
the Intel Manycore Testing Lab (Linux). This was my first time in
the lab, and I wanted to test GHC's [1] SMP parallelism [2] features.

The first challenge was to actually get GHC to work on the lab.
There was a working version of ghc under /opt/ghc6.13/bin/ghc, but I
really needed GHC 7. So first I built GHC 7.0.2-rc2, which worked
without much trouble.

Next step was to get all the necessary libraries in place. Since the
lab has no direct internet access, cabal-install [3] wouldn't be of
much use. Instead, I downloaded a snapshot of hackage [4] with the
latest version of every package and manually installed the packages
I needed. A bit boring, but doable.

Finally I was ready to compile my programs and test. First thing I
tried was an existing algorithm I had which, at some point, takes a
list of about 500 trees and, for each tree, computes a measure which
is expressed as a floating point number. This is basically a map
over a list transforming each tree into a float. Each operation is
independent of the others, and all require the same input, so it
seems ideal for parallelisation. A quick benchmark revealed the
following running times:

http://dreixel.net/images/perm/ParList.png

(Note the non-linear number of cores at the end of the x-axis.)
Apparently there are performance gains with up to 6 cores; adding
more cores after this makes the total running time worse.

While this might sound bad, do note that all that was necessary to
parallelise this algorithm was a one line change: basically, at the
point where the list of floats @l@ is generated, it is replaced with
@l `using` parList rdeepseq@. This change, together with
recompilation using -threaded, is all that is necessary to
parallelise this program.

Later I performed a more accurate benchmark, this time using the
equality function (take two elements and compare them for equality).
The first step was to parallelise the equality function, which,
again, is a very simple task:

-- Tree datatype
data Tree a = Leaf | Bin a (Tree a) (Tree a)

-- Parallel equality
eqTreePar :: Tree Int - Tree Int - Bool
eqTreePar Leaf Leaf = True
eqTreePar (Bin x1 l1 r1) (Bin x2 l2 r2) = x1 == x2  par l (pseq r
(l  r))
 where l = eqTreePar l1 l2
   r = eqTreePar r1 r2
eqTreePar _ _ = False

`par` and `pseq` are the two primitives for parallelisation in GHC
[5]. The performance graph follows:

http://dreixel.net/images/perm/ParEq.png

(This time I ran the benchmark several times; the error bars on the
graph are the standard deviations.) Again we get performance
improvements with up to 6 cores, and after that performance
decreases. What I find really nice is the improvement with two
cores, which is almost a 50% decrease in running time. The ratios
for 2 to 4 cores wrt. the running time with 1 core are 0.52, 0.39,
and 0.35, respectively. This is really good for such a simple change
in the source code, and most people only have up to 4 cores anyway.
In any case, the results of this (very preliminary) experiment seem
to indicate that GHC's SMP parallelism is not particularly optimized
for a high number of cores (yet).

I'm planning to explore this line of research further, and I'm
hoping to be able to conduct more experiments in the near future.
Feel free to contact me if you want more information on what I've done.


Cheers,
Pedro

[1] http://www.haskell.org/ghc/
[2]

Re: [Haskell-cafe] Data.ByteString.Lazy.ByteString vs Data.ByteString.Lazy.Internal.ByteString

2011-03-14 Thread Simon Marlow

On 14/03/2011 10:33, Christian Maeder wrote:

Am 14.03.2011 06:26, schrieb C K Kashyap:

 Looks like a job for Data.Binary.

   I'd like to use it with just the libraries that are part of the
 platform


I forgot to mention, Data.Binary does not seem to be in the platform.


Right, it is not in the platform, but I would recommend to install those
packages that you find useful (and vote for packages to be included into
later versions of the platform.)

Interestingly, there is a hidden package ghc-binary-0.5.0.2, which
almost looks like binary-0.5.0.2.

Maybe ghc developers and platform maintainers could comment on any
differences. If there are none you could simple ghc-pkg expose
ghc-binary. For future versions of ghc and the platform a single
ghc-binary or binary version would be better.


You shouldn't use ghc-binary.  It is indeed the same as binary, and is 
required because GHC uses it internally, but binary is not a platform 
package so we renamed it to ghc-binary and set it to be hidden by default.


Cheers,
Simon

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] ANN: unordered-containers - a new, faster hashing-based containers library

2011-03-14 Thread Johan Tibell
On Mar 14, 2011 6:23 PM, Malcolm Wallace malcolm.wall...@me.com wrote:


 On 22 Feb 2011, at 22:21, Bryan O'Sullivan wrote:

 for some code that's (b) faster than anything else currently available


 I look forward to seeing some benchmarks against libraries other than
containers, such as AVL trees, bytestring-trie, hamtmap, list-trie, etc.
 Good comparisons of different API-usage patterns are hard to come by.

Milan Straka compared containers to a number of other libraries (including
some of those you mentioned) and found them all to be slower. Since
unordered-containers is faster (or sometimes as fast) as containers I
haven't really bothered comparing it to libraries other than containers.

Johan
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[Haskell-cafe] Uninstall Haskell Platform on Mac OS X

2011-03-14 Thread Jesse Schalken
Simple question which an hour of googling and a question on #haskell
couldn't satisfy. :(

I have installed the Haskell Platform 2011.2.0.0 on Mac OS X 10.6.6.

Now how do I *uninstall* it?

Thanks,
Jesse
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Uninstall Haskell Platform on Mac OS X

2011-03-14 Thread Daniël de Kok
On Monday, March 14, 2011 at 3:22 PM, Jesse Schalken wrote:
Simple question which an hour of googling and a question on #haskell couldn't 
satisfy. :(
 
 I have installed the Haskell Platform 2011.2.0.0 on Mac OS X 10.6.6.
 Now how do I uninstall it?

sudo /Library/Frameworks/GHC.framework/Versions/Current/Tools/Uninstaller 

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] writing to a fifo when the reader stops reading

2011-03-14 Thread briand
On Mon, 14 Mar 2011 02:33:13 -0400
Brandon S Allbery KF8NH allber...@gmail.com wrote:

 -BEGIN PGP SIGNED MESSAGE-
 Hash: SHA1
 
 On 3/13/11 03:16 , bri...@aracnet.com wrote:
  ghc: fdWriteBuf: resource vanished (Broken pipe)
  
  which make sense, sort of.  I write a value, let's say 10, and the
  reader reads it.  It's the last value so it closes the fifo.
  
  Now there's nothing reading, so when I get to threadWaitWrite, I
  would expect the program to wait, just as it does when it starts up
  and there is no reader.
 
 FIFOs don't work that way; like a regular pipe, once all readers go
 away it doesn't work any more.  You need to open it read-write
 initially to keep a reader around.  Haskell has no control over
 this:  it's how they're defined to work.

ok,  I wanted to make sure that I wasn't missing something on the
Haskell side.

 
 In general, trying to use a FIFO like an AF_UNIX socket is a mistake.
 


and using a socket doesn't really make sense because everything is
running on the same host, always will be, and using sockets will
unnecessarily complicate things.  although it's not that bad and works
really well.

I'll go figure out a different strategy.

Thank you,

Brian

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Uninstall Haskell Platform on Mac OS X

2011-03-14 Thread Edward Amsden
According to the installer it puts symlinks for executables (a list of
which is on the HP website) in /usr/bin, so you'll want to delete
those.

As far as I recall (I think the installer mentions something about this):
- GHC is installed in /Library/Frameworks/GHC.framework
- HP is installed in /Library/Haskell and
/Library/Frameworks/HaskellPlatform.framework
so deleting those should get rid of it.
- Finally, cabal creates a local configuration and binaries folder ~/.cabal

I'm not sure if this is the recommended uninstall method and I haven't
tried it, but it should get rid of HP for you.

On Mon, Mar 14, 2011 at 10:22 AM, Jesse Schalken
jesseschal...@gmail.com wrote:
 Simple question which an hour of googling and a question on #haskell
 couldn't satisfy. :(
 I have installed the Haskell Platform 2011.2.0.0 on Mac OS X 10.6.6.
 Now how do I uninstall it?
 Thanks,
 Jesse
 ___
 Haskell-Cafe mailing list
 Haskell-Cafe@haskell.org
 http://www.haskell.org/mailman/listinfo/haskell-cafe





-- 
Edward Amsden
Student
Computer Science
Rochester Institute of Technology
www.edwardamsden.com

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Uninstall Haskell Platform on Mac OS X

2011-03-14 Thread Jesse Schalken
This leaves the symlinks alex, cabal, cabal.real, cabal.wrap and
happy in /usr/bin, and also leaves
/Library/Frameworks/HaskellPlatform.framework, and while I can remove
those myself how can I be certain there isn't something else left behind?

On Tue, Mar 15, 2011 at 1:31 AM, Anders Persson anders.cj.pers...@gmail.com
 wrote:

 This is what I do.

 At a terminal prompt:
  sudo /Library/Frameworks/GHC.framework/Versions/Current/Tools/Uninstaller
  sudo rm -r /Library/Haskell

 Cheers,
 Anders

 On Mar 14, 2011, at 3:22 PM, Jesse Schalken wrote:

 Simple question which an hour of googling and a question on #haskell
 couldn't satisfy. :(

 I have installed the Haskell Platform 2011.2.0.0 on Mac OS X 10.6.6.

 Now how do I *uninstall* it?

 Thanks,
 Jesse
 ___
 Haskell-Cafe mailing list
 Haskell-Cafe@haskell.org
 http://www.haskell.org/mailman/listinfo/haskell-cafe



___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Uninstall Haskell Platform on Mac OS X

2011-03-14 Thread Jesse Schalken
I have done this and it has only removed GHC, not the rest of the Haskell
Platform.

On Tue, Mar 15, 2011 at 1:40 AM, Daniël de Kok m...@danieldk.eu wrote:

 On Monday, March 14, 2011 at 3:22 PM, Jesse Schalken wrote:
 Simple question which an hour of googling and a question on #haskell
 couldn't satisfy. :(
 
  I have installed the Haskell Platform 2011.2.0.0 on Mac OS X 10.6.6.
  Now how do I uninstall it?

 sudo /Library/Frameworks/GHC.framework/Versions/Current/Tools/Uninstaller

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] writing to a fifo when the reader stops reading

2011-03-14 Thread Antoine Latter
On Mon, Mar 14, 2011 at 9:44 AM,  bri...@aracnet.com wrote:
 On Mon, 14 Mar 2011 02:33:13 -0400
 Brandon S Allbery KF8NH allber...@gmail.com wrote:

 -BEGIN PGP SIGNED MESSAGE-
 Hash: SHA1

 On 3/13/11 03:16 , bri...@aracnet.com wrote:
  ghc: fdWriteBuf: resource vanished (Broken pipe)
 
  which make sense, sort of.  I write a value, let's say 10, and the
  reader reads it.  It's the last value so it closes the fifo.
 
  Now there's nothing reading, so when I get to threadWaitWrite, I
  would expect the program to wait, just as it does when it starts up
  and there is no reader.

 FIFOs don't work that way; like a regular pipe, once all readers go
 away it doesn't work any more.  You need to open it read-write
 initially to keep a reader around.  Haskell has no control over
 this:  it's how they're defined to work.

 ok,  I wanted to make sure that I wasn't missing something on the
 Haskell side.


 In general, trying to use a FIFO like an AF_UNIX socket is a mistake.



 and using a socket doesn't really make sense because everything is
 running on the same host, always will be, and using sockets will
 unnecessarily complicate things.  although it's not that bad and works
 really well.


I think the prior emailer was recommending file sockets, not TCP
sockets: http://en.wikipedia.org/wiki/Unix_domain_socket

These only work on the same host.

 I'll go figure out a different strategy.

 Thank you,

 Brian

 ___
 Haskell-Cafe mailing list
 Haskell-Cafe@haskell.org
 http://www.haskell.org/mailman/listinfo/haskell-cafe


___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Uninstall Haskell Platform on Mac OS X

2011-03-14 Thread Anders Persson
This is a procedure suggested by Mark Lentczner on the haskell-platform mailing 
list. It clears out _any_ and _all_ versions of haskell platform, so use with 
care.

/Anders

Begin forwarded message:

 These installers don't attempt to uninstall prior versions, and depending on
 how your prior versions were installed, they may, or may not, happily co-exist
 with this installation. I'm interested to hear experience reports of trying
 these installers both systems both with and without prior Haskell setups.
 
 You can probably erase most (all?) traces of a prior Haskell install with this
 procedure:
   sudo rm -rf /Library/Frameworks/GHC.framework
   sudo rm -rf /Library/Frameworks/HaskellPlatform.framework
   sudo rm -rf /Library/Haskell
   rm -rf .cabal
   rm -rf .ghc
   rm -rf ~/Library/Haskell
   find /usr/bin /usr/local/bin -type l | \
 xargs -If sh -c '/bin/echo -n f /; readlink f' | \
 egrep '//Library/(Haskell|Frameworks/(GHC|HaskellPlatform).framework)' | \
 cut -f 1 -d ' '  /tmp/hs-bin-links
   # review /tmp/hs-links
   sudo rm `cat /tmp/hs-bin-links`

On Mar 14, 2011, at 3:48 PM, Jesse Schalken wrote:

 This leaves the symlinks alex, cabal, cabal.real, cabal.wrap and 
 happy in /usr/bin, and also leaves 
 /Library/Frameworks/HaskellPlatform.framework, and while I can remove those 
 myself how can I be certain there isn't something else left behind?
 
 On Tue, Mar 15, 2011 at 1:31 AM, Anders Persson anders.cj.pers...@gmail.com 
 wrote:
 This is what I do.
 
 At a terminal prompt:
  sudo /Library/Frameworks/GHC.framework/Versions/Current/Tools/Uninstaller
  sudo rm -r /Library/Haskell
 
 Cheers,
 Anders
 
 On Mar 14, 2011, at 3:22 PM, Jesse Schalken wrote:
 
 Simple question which an hour of googling and a question on #haskell 
 couldn't satisfy. :(
 
 I have installed the Haskell Platform 2011.2.0.0 on Mac OS X 10.6.6.
 
 Now how do I uninstall it?
 
 Thanks,
 Jesse
 ___
 Haskell-Cafe mailing list
 Haskell-Cafe@haskell.org
 http://www.haskell.org/mailman/listinfo/haskell-cafe
 
 

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[Haskell-cafe] Question on a common pattern

2011-03-14 Thread tsuraan
In my code, I'm doing this quite a lot:

x - someIO
case x of
  Opt1 - ...

Having a line for extracting the value from the IO (or STM) and then
acting on the value seems unnatural.  Is there a more concise way to
do this?  This code:

case someIO of
  Opt1 - ...

Doesn't work, but is there something like that, that is valid?

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Question on a common pattern

2011-03-14 Thread Ozgur Akgun
See this thread:
http://www.haskell.org/pipermail/haskell-cafe/2010-October/084291.html

On 14 March 2011 15:48, tsuraan tsur...@gmail.com wrote:

 In my code, I'm doing this quite a lot:

 x - someIO
 case x of
  Opt1 - ...

 Having a line for extracting the value from the IO (or STM) and then
 acting on the value seems unnatural.  Is there a more concise way to
 do this?  This code:

 case someIO of
  Opt1 - ...

 Doesn't work, but is there something like that, that is valid?

 ___
 Haskell-Cafe mailing list
 Haskell-Cafe@haskell.org
 http://www.haskell.org/mailman/listinfo/haskell-cafe




-- 
Ozgur Akgun
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Question on a common pattern

2011-03-14 Thread Chris Dornan
Your first line is entirely natural.

 

The alternative doesn't look right at all.

 

I am not aware of a more concise alternative to this general construction
(assuming there are multiple case alternative, and that the work can't be
done with library functions).

 

Chris

 

From: haskell-cafe-boun...@haskell.org
[mailto:haskell-cafe-boun...@haskell.org] On Behalf Of tsuraan
Sent: 14 March 2011 15:49
To: haskell-cafe@haskell.org
Subject: [Haskell-cafe] Question on a common pattern

 

In my code, I'm doing this quite a lot:

x - someIO
case x of
  Opt1 - ...

Having a line for extracting the value from the IO (or STM) and then
acting on the value seems unnatural.  Is there a more concise way to
do this?  This code:

case someIO of
  Opt1 - ...

Doesn't work, but is there something like that, that is valid?

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe 

  _  

No virus found in this message.
Checked by AVG - www.avg.com
Version: 10.0.1204 / Virus Database: 1498/3506 - Release Date: 03/14/11

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Question on a common pattern

2011-03-14 Thread Yves Parès
If you have only one alternative, then you can simply do:

Opt1 - someIO

E.g., if you are _sure_ that foo returns always a 'Just' within a monad you
can perfectly do :

Just x - foo


2011/3/14 tsuraan tsur...@gmail.com

 In my code, I'm doing this quite a lot:

 x - someIO
 case x of
  Opt1 - ...

 Having a line for extracting the value from the IO (or STM) and then
 acting on the value seems unnatural.  Is there a more concise way to
 do this?  This code:

 case someIO of
  Opt1 - ...

 Doesn't work, but is there something like that, that is valid?

 ___
 Haskell-Cafe mailing list
 Haskell-Cafe@haskell.org
 http://www.haskell.org/mailman/listinfo/haskell-cafe

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Question on a common pattern

2011-03-14 Thread tsuraan
 See this
 thread: http://www.haskell.org/pipermail/haskell-cafe/2010-October/084291.html

Which links to http://hackage.haskell.org/trac/ghc/ticket/4359 .
Looks like there's already been quite a bit of discussion on this
already :)  Thanks for the link.

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Question on a common pattern

2011-03-14 Thread tsuraan
 If you have only one alternative, then you can simply do:

 Opt1 - someIO

 E.g., if you are _sure_ that foo returns always a 'Just' within a monad you
 can perfectly do :

 Just x - foo

That's interesting.  I had no idea that one could do that.  I think
what I'm looking for is something along the lines of lambda-case, but
thanks for the tip.

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[Haskell-cafe] Wanted: composoable parsers from haskell-src-exts

2011-03-14 Thread J . Waldmann
Hi.

I want to use parsers from haskell-src-exts as sub-parsers,
which does not seem to work since they insist on consuming the input completely.

I would need them to parse a maximal prefix, 
and return the (unconsumed) rest of input as well
(cf.
http://hackage.haskell.org/packages/archive/parsec/3.1.1/doc/html/Text-Parsec-Prim.html#v:getInput
)

I figure that happy has the %partial directive for that, but the description
http://www.haskell.org/happy/doc/html/sec-directives.html#sec-partial-parsers
does not really tell me how to obtain the rest of the input.

Any hints (or code samples) appreciated. Thanks - J.W.



___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Wanted: composoable parsers from haskell-src-exts

2011-03-14 Thread Stephen Tetley
I haven't tried myself - but from the docs, partial parsers seem to
depend on finding an error token so they seem to be partial as in
handles failure.

If you want to parse specific fragments you probably want to generate
multiple parsers from a single grammar see section 2.7.

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[Haskell-cafe] ANN: craftwerk-0.1, craftwerk-cairo-0.1, craftwerk-gtk-0.1

2011-03-14 Thread Malte Harder
Dear all,

I just released the first version of the Craftwerk graphics library for
2d vector graphics. Craftwerk is intended to act as an abstract
interface to different backend drivers. The library itself has a TikZ
(http://sourceforge.net/projects/pgf) driver builtin to output vector
graphics for use in LaTeX documents. The craftwerk-cairo library
supplies a Cairo output function to the library. The aim is to support
these two backends in a seamless manner such that graphics created with
either backend are not or nearly not distinguishable.

The third package (craftwerk-gtk) contains convenience functions to
display graphics created with craftwerk directly in a Gtk window,
including the basic zooming, PDF  TikZ export via a file chooser
dialog. It also allows to create a simple user interface that passes
options to the rendering function.

The feature support is rather rudimentary at the moment, but for current
Cairo users most features should be already available from within the
craftwerk API. The aim is to support more high level functions like TikZ
offers.

The project started when I realized that I need to prepare a lot of
visualizations at university twice, once for display and once for print.
I hope that this library proves to be useful for people with similar
tasks. A great thing would be if the Chart library allows to plug
another backend in. I haven't really looked into that, but this would
allow me to leave Gnuplot and R behind for most purposes and at the same
time get higher quality output that is better integrable.

I started learning Haskell only half a year ago and this is my first
real project. So far I have to say that I enjoy it very much. Therefore,
if you find some weird constructions or have any comments about the
design of the library, I'm looking forward for any feedback!

The source repository can be found under:
https://github.com/mahrz/Craftwerk

and packages here:
http://hackage.haskell.org/package/craftwerk-0.1
http://hackage.haskell.org/package/craftwerk-cairo-0.1
http://hackage.haskell.org/package/craftwerk-gtk-0.1

Best,
Malte

--
Malte Harder
malte.har...@gmail.com



___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] [Haskell] ANN: craftwerk-0.1, craftwerk-cairo-0.1, craftwerk-gtk-0.1

2011-03-14 Thread Vo Minh Thu
2011/3/14 Malte Harder malte.har...@googlemail.com:
 Dear all,

 I just released the first version of the Craftwerk graphics library for
 2d vector graphics. Craftwerk is intended to act as an abstract
 interface to different backend drivers. The library itself has a TikZ
 (http://sourceforge.net/projects/pgf) driver builtin to output vector
 graphics for use in LaTeX documents. The craftwerk-cairo library
 supplies a Cairo output function to the library. The aim is to support
 these two backends in a seamless manner such that graphics created with
 either backend are not or nearly not distinguishable.

 The third package (craftwerk-gtk) contains convenience functions to
 display graphics created with craftwerk directly in a Gtk window,
 including the basic zooming, PDF  TikZ export via a file chooser
 dialog. It also allows to create a simple user interface that passes
 options to the rendering function.

 The feature support is rather rudimentary at the moment, but for current
 Cairo users most features should be already available from within the
 craftwerk API. The aim is to support more high level functions like TikZ
 offers.

 The project started when I realized that I need to prepare a lot of
 visualizations at university twice, once for display and once for print.
 I hope that this library proves to be useful for people with similar
 tasks. A great thing would be if the Chart library allows to plug
 another backend in. I haven't really looked into that, but this would
 allow me to leave Gnuplot and R behind for most purposes and at the same
 time get higher quality output that is better integrable.

 I started learning Haskell only half a year ago and this is my first
 real project. So far I have to say that I enjoy it very much. Therefore,
 if you find some weird constructions or have any comments about the
 design of the library, I'm looking forward for any feedback!

 The source repository can be found under:
 https://github.com/mahrz/Craftwerk

 and packages here:
 http://hackage.haskell.org/package/craftwerk-0.1
 http://hackage.haskell.org/package/craftwerk-cairo-0.1
 http://hackage.haskell.org/package/craftwerk-gtk-0.1

Hi Malte,

Your project sounds very good (I will unfortunately not have time to
look at it carefully before some time).

I guess you know about reddit, anyway there is a thread about your
library there: 
http://www.reddit.com/r/haskell/comments/g3xp1/craftwerk_a_highlevel_and_easy_to_use_graphics/

Could you please as suggest one comment include some screenshots (even
better with some code next to them) on the homepage?

Thanks for making the code available on both github and hackage!
Thu

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] [Haskell] ANN: craftwerk-0.1, craftwerk-cairo-0.1, craftwerk-gtk-0.1

2011-03-14 Thread Malte Harder
Hi Thu,

 Could you please as suggest one comment include some screenshots (even
 better with some code next to them) on the homepage?

indeed, that's a good idea. I just put two examples up. There will be
some more examples coming soon.

Best,
Malte


___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[Haskell-cafe] simple stm question

2011-03-14 Thread qld3303
I recently upgraded to ghc 7.0.2 from 6.12.3, along with the Haskell
platform, and noticed that the following code no longer works as expected:

waitFor tvar = atomically $ do
count - readTVar tvar
check (count == 0)

worker tchan tvar = loop
   where loop = do
   putStrLn checking
   finished - atomically $ isEmptyTChan tchan
   threadDelay 5
   if finished
  then atomically $ do val - readTVar tvar
   writeTVar tvar $ (subtract 1) val
  else (atomically $ readTChan tchan)  loop

test = do
  tchan - newTChanIO
  pure $ forM_ [1..5] $ writeTChan tchan -- THIS LINE
  tvar - newTVarIO 1
  forkIO $ worker tchan tvar
  waitFor tvar
  putStrLn DONE

This will work if I use atomically, but otherwise it does nothing, tchan
remains empty afterwards.
I'm not clear how this should behave.
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] simple stm question

2011-03-14 Thread Brandon Moore
I recently upgraded to ghc 7.0.2 from 6.12.3, along with the Haskell platform, 
and noticed that the following code no longer works as expected:

waitFor tvar = atomically $ do
count - readTVar tvar
check (count == 0)

worker tchan tvar = loop
   where loop = do
   putStrLn checking
   finished - atomically $ isEmptyTChan tchan
   threadDelay 5
   if finished
  then atomically $ do val - readTVar tvar
   writeTVar tvar $ (subtract 1) val
  else (atomically $ readTChan tchan)  loop

test = do
  tchan - newTChanIO
  pure $ forM_ [1..5] $ writeTChan tchan -- THIS LINE 
  tvar - newTVarIO 1
  forkIO $ worker tchan tvar
  waitFor tvar
  putStrLn DONE

You did not include your imports, but I assume that's Control.Applicative.pure.
If so, that line should never do anything. pure for IO is the same as return -
you are never running the STM action that line calculates. It's the
same as if you had written

test = do
  tchan - newTChanIO
  let neverGetsUsed = forM_ [1..5] $ writeTChan tchan -- THIS LINE 
  tvar - newTVarIO 1
  forkIO $ worker tchan tvar
  waitFor tvar
  putStrLn DONE

Brandon



  

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] simple stm question

2011-03-14 Thread Felipe Almeida Lessa
On Mon, Mar 14, 2011 at 11:56 PM, qld3303 qld3...@gmail.com wrote:
 This will work if I use atomically, but otherwise it does nothing, tchan
 remains empty afterwards.
 I'm not clear how this should behave.

You really should use atomically on that line.  I don't see how it
worked before.

-- 
Felipe.

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] simple stm question

2011-03-14 Thread qld3303
I must've been mistaken.
Thanks

On Mon, Mar 14, 2011 at 7:05 PM, Felipe Almeida Lessa 
felipe.le...@gmail.com wrote:

 On Mon, Mar 14, 2011 at 11:56 PM, qld3303 qld3...@gmail.com wrote:
  This will work if I use atomically, but otherwise it does nothing, tchan
  remains empty afterwards.
  I'm not clear how this should behave.

 You really should use atomically on that line.  I don't see how it
 worked before.

 --
 Felipe.

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[arch-haskell] AUR Out-of-date Notification for haskell-haskellformaths

2011-03-14 Thread AUR Feedback
Your package haskell-haskellformaths has been flagged out of date by
Sara [1]. You may view your package at:
http://aur.archlinux.org/packages.php?ID=2

[1] - http://aur.archlinux.org/account.php?Action=AccountInfoID=12529


___
arch-haskell mailing list
arch-haskell@haskell.org
http://www.haskell.org/mailman/listinfo/arch-haskell


[arch-haskell] AUR Comment for haskell-yesod

2011-03-14 Thread AUR Feedback
from http://aur.archlinux.org/packages.php?ID=35370
pdxleif wrote:

Apparently this package triggers a compiler error in GHC 7.0.2.
http://hackage.haskell.org/trac/ghc/ticket/5004

---
If you no longer wish to receive notifications about this package,
please go the the above package page and click the UnNotify button.


___
arch-haskell mailing list
arch-haskell@haskell.org
http://www.haskell.org/mailman/listinfo/arch-haskell


[arch-haskell] AUR Comment for haskell-yesod

2011-03-14 Thread AUR Feedback
from http://aur.archlinux.org/packages.php?ID=35370
deteego wrote:

You can add the -fproduction flag to setup configure in the PKGBUILD
to build yesod with GHC 7.0.2.

i.e. change 
runhaskell Setup configure -O --enable-split-objs --enable-shared 
to
runhaskell Setup configure -O --enable-split-objs --enable-shared
-fproduction

---
If you no longer wish to receive notifications about this package,
please go the the above package page and click the UnNotify button.


___
arch-haskell mailing list
arch-haskell@haskell.org
http://www.haskell.org/mailman/listinfo/arch-haskell


[arch-haskell] AUR Out-of-date Notification for haskell-hinotify

2011-03-14 Thread AUR Feedback
Your package haskell-hinotify has been flagged out of date by cgirard
[1]. You may view your package at:
http://aur.archlinux.org/packages.php?ID=17596

[1] - http://aur.archlinux.org/account.php?Action=AccountInfoID=16599


___
arch-haskell mailing list
arch-haskell@haskell.org
http://www.haskell.org/mailman/listinfo/arch-haskell


[arch-haskell] AUR Comment for lhs2tex

2011-03-14 Thread AUR Feedback
from http://aur.archlinux.org/packages.php?ID=12648
benediktf wrote:

I had the same error.
It worked after running:

sudo chmod a+r -R /usr/share/lhs2tex-1.16

---
If you no longer wish to receive notifications about this package,
please go the the above package page and click the UnNotify button.


___
arch-haskell mailing list
arch-haskell@haskell.org
http://www.haskell.org/mailman/listinfo/arch-haskell


Re: [arch-haskell] Please contribute patches

2011-03-14 Thread Leif Warner
I submitted a pull request for yesod and a number of other things:
https://github.com/archhaskell/habs/pull/47
https://github.com/archhaskell/habs/pull/47Do I also need to drop a note
here for it to get noticed, or what is the preferred way of notifying about
such things?
-Leif Warner

On Sun, Mar 13, 2011 at 7:55 AM, Peter Simons sim...@cryp.to wrote:

 Hi guys,

 the following packages don't build anymore because of version conflicts:

  agda-executable
  haskell-agda
  haskell-authenticate
  haskell-dbus-core
  haskell-libxml-sax
  haskell-sifflet-lib
  haskell-yesod-auth
  haskell-yesod-core
  haskell-yesod-form
  haskell-yesod-json
  haskell-yesod-persistent
  haskell-yesod-static
  haskell-yesod
  sifflet
  yi

 I guess that the problems are simple to fix, but if anyone happens to
 have such a fix already, then please send in a patch! It's probably
 easiest to post the output from 'git format-patch' to this list. If you
 prefer to work via Github, then the usual fork/merge-request procedure
 for the archhaskell/habs repository works fine, too, of course.

 Take care,
 Peter


 ___
 arch-haskell mailing list
 arch-haskell@haskell.org
 http://www.haskell.org/mailman/listinfo/arch-haskell

___
arch-haskell mailing list
arch-haskell@haskell.org
http://www.haskell.org/mailman/listinfo/arch-haskell


Re: [arch-haskell] Please contribute patches

2011-03-14 Thread Peter Simons
Hi Leif,

  I submitted a pull request for yesod and a number of other things:
  https://github.com/archhaskell/habs/pull/47. Do I also need to drop a
  note here for it to get noticed, or what is the preferred way of
  notifying about such things?

as of now, I don't receive e-mail notifications when a pull request is opened.
I've tried to enable that feature in Github, but I couldn't figure out how to
do it. Notificationts seem to be enabled for repositories that my user owns,
but 'archhaskell/habs' isn't one of them. Duh. :-(

It's probably best to send an e-mail to this list, too, when filing a pull
request.

Take care,
Peter


___
arch-haskell mailing list
arch-haskell@haskell.org
http://www.haskell.org/mailman/listinfo/arch-haskell


Re: [arch-haskell] Please contribute patches

2011-03-14 Thread Magnus Therning
On Mon, Mar 14, 2011 at 19:22, Peter Simons sim...@cryp.to wrote:
 Hi Leif,

   I submitted a pull request for yesod and a number of other things:
   https://github.com/archhaskell/habs/pull/47. Do I also need to drop a
   note here for it to get noticed, or what is the preferred way of
   notifying about such things?

 as of now, I don't receive e-mail notifications when a pull request is opened.
 I've tried to enable that feature in Github, but I couldn't figure out how to
 do it. Notificationts seem to be enabled for repositories that my user owns,
 but 'archhaskell/habs' isn't one of them. Duh. :-(

I had that problem myself in the beginning, what I found out was that
you need to be member of a team that has access to the repo.  There is
a notice of it, but I didn't see it until long after I got help from
the github team.

/M

-- 
Magnus Therning                      OpenPGP: 0xAB4DFBA4
email: mag...@therning.org   jabber: mag...@therning.org
twitter: magthe               http://therning.org/magnus

___
arch-haskell mailing list
arch-haskell@haskell.org
http://www.haskell.org/mailman/listinfo/arch-haskell