Re: ANNOUNCE: GHC 7.10.1 Release Candidate 3

2015-03-17 Thread Bas van Dijk
On 16 March 2015 at 21:30, Austin Seipp aus...@well-typed.com wrote: We are pleased to announce the third release candidate for GHC 7.10.1: https://downloads.haskell.org/~ghc/7.10.1-rc3 https://downloads.haskell.org/~ghc/7.10.1-rc3/docs/html/ I noticed that the Haddock docs return

Re: Thread behavior in 7.8.3

2015-01-21 Thread Bas van Dijk
Hi Michael, Are you already using usb-1.3.0.0? If not, could you upgrade and test again? That release fixed the deadlock that Ben and Carter where talking about. Good luck, Bas ___ Glasgow-haskell-users mailing list Glasgow-haskell-users@haskell.org

Re: Proving properties of type-level natural numbers obtained from user input

2014-11-25 Thread Bas van Dijk
- return $ f2 p _ - error Input if larger than 255 On 25 November 2014 at 10:51, Bas van Dijk v.dijk@gmail.com wrote: Hi, I have another type-level programming related question: {-# LANGUAGE GADTs #-} {-# LANGUAGE TypeOperators #-} {-# LANGUAGE ScopedTypeVariables

Re: Proving properties of type-level natural numbers obtained from user input

2014-11-25 Thread Bas van Dijk
On 25 November 2014 at 19:34, Richard Eisenberg e...@cis.upenn.edu wrote: If I were you, I would just write `g` using unsafeCoerce in the right spot, instead of bothering with all the singletons, which would have to use unsafety anyway. Thanks, I hadn't considered this yet. Cheers, Bas

Proving properties of type-level natural numbers obtained from user input

2014-11-24 Thread Bas van Dijk
Hi, I have another type-level programming related question: {-# LANGUAGE GADTs #-} {-# LANGUAGE TypeOperators #-} {-# LANGUAGE ScopedTypeVariables #-} {-# LANGUAGE KindSignatures #-} import GHC.TypeLits Say I have a Proxy p of some type-level natural number: p :: forall (n :: Nat).

Caching intermediate powers in GHC.Float

2014-05-16 Thread Bas van Dijk
Does the following make sense: https://ghc.haskell.org/trac/ghc/ticket/9120 Bas ___ Glasgow-haskell-users mailing list Glasgow-haskell-users@haskell.org http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

Re: Private classes

2013-08-17 Thread Bas van Dijk
Hi Joachim, I used the following in the past: module M (PublicClass(..)) where class HiddenClass a class HiddenClass a = PublicClass a where ... instance HiddenClass SomeType instance PublicClass SomeType where ... Now users of M can't declare instances of PublicClass because they don't

Re: [Haskell] ANNOUNCE: GHC version 7.6.1

2012-09-07 Thread Bas van Dijk
On 6 September 2012 18:05, Ian Lynagh i...@well-typed.com wrote: The GHC Team is pleased to announce a new major release of GHC, 7.6.1. Great! * It is now possible to defer type errors until runtime using the -fdefer-type-errors flag. In section 7.13.1 it says: ...given the following

Re: New INLINE pragma syntax idea, and some questions

2012-08-07 Thread Bas van Dijk
On 4 August 2012 15:53, Brandon Simmons brandon.m.simm...@gmail.com wrote: The only thing that bothers me about this foldl is the presence of z0 xs0, which I think are only there on the LHS to indicate to GHC where it should inline. Are these really needed? Since GHC only inlines functions

Re: Type error when deriving Generic for an associated data type

2012-07-13 Thread Bas van Dijk
On 12 July 2012 12:33, Andres Löh and...@well-typed.com wrote: Your example compiles for me with HEAD (but fails with 7.4.1 and 7.4.2, yes). I've not tested if it also works. Great, I will wait for a new release then. Bas ___ Glasgow-haskell-users

Type error when deriving Generic for an associated data type

2012-07-12 Thread Bas van Dijk
Hi, I'm hitting on an issue when deriving Generic for an associated data type: {-# LANGUAGE TypeFamilies #-} {-# LANGUAGE DeriveGeneric #-} import GHC.Generics class Foo a where data T a :: * instance Foo Int where data T Int = Bla deriving Generic Couldn't match type `Rep (T Int)'

Re: Segmentation fault/access violation in generated code

2012-06-23 Thread Bas van Dijk
On 23 June 2012 02:40, Ian Lynagh ig...@earth.li wrote: Hi Bas, On Sun, Jun 17, 2012 at 05:11:35PM +0200, Bas van Dijk wrote: module Main where import Foreign import qualified Foreign.Concurrent as FC import Control.Concurrent import Bindings.Libusb.InitializationDeinitialization main

Re: Segmentation fault/access violation in generated code

2012-06-19 Thread Bas van Dijk
I just tried building the following program with the new GHC win64_alpha1 and apart from warnings from using the unsupported stdcall calling convention running the program doesn't give a segmentation fault as it does when building the program with GHC-7.4.2: {-# LANGUAGE ForeignFunctionInterface

Segmentation fault/access violation in generated code

2012-06-17 Thread Bas van Dijk
Hello, I'm trying to solve #5254 (http://hackage.haskell.org/trac/ghc/ticket/5254). The issue can be isolated to the following short program which only uses bindings-libusb

Re: Weird behavior of the NonTermination exception

2012-05-04 Thread Bas van Dijk
On 4 May 2012 14:12, Simon Marlow marlo...@gmail.com wrote: The forked thread is deadlocked, so the MVar is considered unreachable and the main thread is also unreachable.  Hence both threads get sent the exception. The RTS does this analysis using the GC, tracing the reachable objects

Weird behavior of the NonTermination exception

2012-05-03 Thread Bas van Dijk
Hello, Before I turn the following into a ticket I want to ask if I miss something obvious: When I run the following program: - import Prelude hiding (catch) import Control.Exception import Control.Concurrent main :: IO () main = do mv -

Re: Weird behavior of the NonTermination exception

2012-05-03 Thread Bas van Dijk
On 3 May 2012 17:31, Edward Z. Yang ezy...@mit.edu wrote: Excerpts from Bas van Dijk's message of Thu May 03 11:10:38 -0400 2012: As can be seen, the putMVar is executed successfully. So why do I get the message: thread blocked indefinitely in an MVar operation? GHC will send

Re: Weird behavior of the NonTermination exception

2012-05-03 Thread Bas van Dijk
On 3 May 2012 18:14, Bas van Dijk v.dijk@gmail.com wrote: Now it seems the thread is killed while delaying. But why is it killed? Oh I realise the forked thread is killed because the main thread terminates because it received a BlockedIndefinitelyOnMVar exception and then all daemonic

Re: default instance for IsString

2012-04-23 Thread Bas van Dijk
On 23 April 2012 20:34, J. Garrett Morris jgmor...@cs.pdx.edu wrote: On Mon, Apr 23, 2012 at 9:58 AM, Yitzchak Gale g...@sefer.org wrote: In addition, OverloadedStrings is unsound. No.  OverloadedStrings treats string literals as applications of fromString to character list constants.  

GHCi-7.4.1: Importing a non existing module succeeds

2012-02-09 Thread Bas van Dijk
Should I file a bug for this: GHCi 7.2.2: import I.Do.Not.Exist no location info: Could not find module `I.Do.Not.Exist' Use -v to see a list of the files searched for. GHCi 7.4.1: import I.Do.Not.Exist (and for the record: I.Do.Not.Exist does not exist) Bas

Error when deriving Typeable for associated type

2012-01-30 Thread Bas van Dijk
Hello, Given the following program: --- {-# LANGUAGE DeriveDataTypeable, TypeFamilies #-} import Data.Typeable class C a where data T a :: * data MyType1 = MyType1 deriving Typeable data MyType2 = MyType2 deriving Typeable instance

Error when building cabal package with template haskell configured for profiling

2012-01-27 Thread Bas van Dijk
Hello, I would like to profile a cabal package that contains template haskell code. However I get the following error: $ cabal configure --ghc-options=-O2 -prof -auto-all -caf-all ... $ cabal build ... Dynamic linking required, but this is a non-standard build (eg. prof). You need to build

Re: Error when building cabal package with template haskell configured for profiling

2012-01-27 Thread Bas van Dijk
On 27 January 2012 15:14, Felipe Almeida Lessa felipe.le...@gmail.com wrote: On Fri, Jan 27, 2012 at 12:06 PM, Bas van Dijk v.dijk@gmail.com wrote: $ cabal configure --ghc-options=-O2 -prof -auto-all -caf-all Why aren't you using the specific options for profiling? $ cabal configure

Re: ConstraintKinds and default associated empty constraints

2012-01-08 Thread Bas van Dijk
On 23 December 2011 17:44, Simon Peyton-Jones simo...@microsoft.com wrote: My attempt at forming a new understanding was driven by your example. class Functor f where    type C f :: * - Constraint    type C f = () sorry -- that was simply type incorrect.  () does not have kind *  -

Re: ConstraintKinds and default associated empty constraints

2012-01-08 Thread Bas van Dijk
be replaced by a _. Bas On Jan 9, 2012 6:22 AM, wren ng thornton w...@freegeek.org wrote: On 1/8/12 8:32 AM, Bas van Dijk wrote: On 23 December 2011 17:44, Simon Peyton-Jonessimonpj@**microsoft.comsimo...@microsoft.com wrote: My attempt at forming a new understanding was driven by your example

Re: ConstraintKinds and default associated empty constraints

2011-12-22 Thread Bas van Dijk
On 22 December 2011 01:58, wagne...@seas.upenn.edu wrote: Quoting Bas van Dijk v.dijk@gmail.com: I'm playing a bit with the new ConstraintKinds feature in GHC 7.4.1-rc1. I'm trying to give the Functor class an associated constraint so that we can make Set an instance of Functor

Re: ConstraintKinds and default associated empty constraints

2011-12-22 Thread Bas van Dijk
On 22 December 2011 09:31, Simon Peyton-Jones simo...@microsoft.com wrote: What about class Functor f where    type C f :: * - Constraint    type C f = () After all, just as (Ord a, Show a) is a contraint, so is (). But there's a kind mis-match there. `C f` should have kind `* -

Re: ANNOUNCE: GHC 7.4.1 Release Candidate 1

2011-12-21 Thread Bas van Dijk
On 21 December 2011 19:29, Ian Lynagh ig...@earth.li wrote:  * There is a new feature constraint kinds (-XConstraintKinds):       http://www.haskell.org/ghc/dist/stable/docs/html/users_guide/constraint-kind.html I'm trying to run the ConstraintKinds example from the documentation: {-#

Re: ANNOUNCE: GHC 7.4.1 Release Candidate 1

2011-12-21 Thread Bas van Dijk
On 22 December 2011 00:10, José Pedro Magalhães j...@cs.uu.nl wrote: Hi Bas, On Wed, Dec 21, 2011 at 23:02, Bas van Dijk v.dijk@gmail.com wrote: On 21 December 2011 19:29, Ian Lynagh ig...@earth.li wrote:  * There is a new feature constraint kinds (-XConstraintKinds):  http

ConstraintKinds and default associated empty constraints

2011-12-21 Thread Bas van Dijk
I'm playing a bit with the new ConstraintKinds feature in GHC 7.4.1-rc1. I'm trying to give the Functor class an associated constraint so that we can make Set an instance of Functor. The following code works but I wonder if the trick with: class Empty a; instance Empty a, is the recommended way to

GHC HEAD build error

2011-12-07 Thread Bas van Dijk
Hello, I'm trying to build GHC HEAD but get the following error: inplace/bin/ghc-stage1 -H64m -O0 -fasm -Iincludes -Irts -Irts/dist/build -DCOMPILING_RTS -package-name rts -dcmm-lint -i -irts -irts/dist/build -irts/dist/build/autogen -Irts/dist/build -Irts/dist/build/autogen

Re: Why no multiple default method implementations?

2011-11-24 Thread Bas van Dijk
On 24 November 2011 16:46, José Pedro Magalhães j...@cs.uu.nl wrote: Hi Bas, On Thu, Nov 24, 2011 at 09:23, Bas van Dijk v.dijk@gmail.com wrote: Hello, Now that we have DefaultSignatures, why is it not allowed to have multiple default method implementations, as in: {-# LANGUAGE

Re: ANNOUNCE: GHC version 7.2.2

2011-11-11 Thread Bas van Dijk
On 11 November 2011 22:03, Ian Lynagh ig...@earth.li wrote: The GHC Team is pleased to announce a new bugfix release of GHC, 7.2.2. Yay! These GHC releases always feel like little presents... I noticed the links to modules in base in the latest docs point to the previous base library causing

Re: ANNOUNCE: GHC version 7.2.2

2011-11-11 Thread Bas van Dijk
On 12 November 2011 00:18, Ian Lynagh ig...@earth.li wrote: Looks fine to me. Perhaps you have a cached copy? You're right. Sorry for the noise. Bas ___ Glasgow-haskell-users mailing list Glasgow-haskell-users@haskell.org

Re: Type error: Expected type: T. Actual type T ???

2011-10-31 Thread Bas van Dijk
I reported this in the issue tracker: http://hackage.haskell.org/trac/ghc/ticket/5595 Bas ___ Glasgow-haskell-users mailing list Glasgow-haskell-users@haskell.org http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

Re: Type error: Expected type: T. Actual type T ???

2011-10-30 Thread Bas van Dijk
On 30 October 2011 02:29, wren ng thornton w...@freegeek.org wrote: ... Shouldn't the type of foo be:    forall t m a    .  (Monad m, MonadTransControl t)    = (Run t - m a)    - t m a ? Yes, that's the proper quantification. One more fact: when I change the associated type synonym to a

Type error: Expected type: T. Actual type T ???

2011-10-29 Thread Bas van Dijk
Hello, I'm working on a new design of monad-control[1]. However I get a type error I don't understand. Here's an isolated example: {-# LANGUAGE UnicodeSyntax, RankNTypes, TypeFamilies #-} class MonadTransControl t where type St t ∷ * → * liftControl ∷ Monad m ⇒ (Run t → m α) → t m α

Re: GHC infinite loop when building vector program

2011-10-12 Thread Bas van Dijk
Thanks Daniel for confirming this. I suspect this is caused by some rewrite rules in vector. So I reported it in their issue-tracker: http://trac.haskell.org/vector/ticket/63 Regards, Bas ___ Glasgow-haskell-users mailing list

GHC infinite loop when building vector program

2011-10-11 Thread Bas van Dijk
Hello, When benchmarking my new vector-bytestring[1] package I discovered that building the following program causes GHC to go into, what seems to be, an infinite loop: import Data.Vector (Vector) import qualified Data.Vector.Generic as VG main = print $ VG.foldl f z (VG.fromList [] :: Vector

Re: GHC infinite loop when building vector program

2011-10-11 Thread Bas van Dijk
On 11 October 2011 21:11, Bas van Dijk v.dijk@gmail.com wrote: Note that the program also builds fine when I change the 'f' and 'z' to: f = flip (:) z = [] Oops, I meant to say: Note that the program also builds fine when I change the 'f' and 'z' to: f = (+) z = 0

Re: REQ: add a non-closing version of handleToFd

2011-10-06 Thread Bas van Dijk
On 6 October 2011 14:58, Simon Marlow marlo...@gmail.com wrote: ... What you can do is make a withHandleFD:  withHandleFD :: Handle - (FD - IO a) - IO a it's still quite dodgy, depending on what you do with the FD.  Perhaps it should be called unsafeWithHandleFD. Anyway, patches gratefully

Re: Getting the file descriptor from a handle, without closing it

2011-10-01 Thread Bas van Dijk
On 1 October 2011 08:30, Volker Wysk p...@volker-wysk.de wrote: 1. data FD = FD {  fdFD :: {-# UNPACK #-} !CInt,  fdIsNonBlocking :: {-# UNPACK #-} !Int  } What is that exclamation mark? That's a strictness annotation and is haskell98/2010:

Re: Associativity of the generic representation of sum types

2011-09-22 Thread Bas van Dijk
2011/9/22 José Pedro Magalhães j...@cs.uu.nl: Hi Bas, On Thu, Sep 22, 2011 at 03:55, Bas van Dijk v.dijk@gmail.com wrote: Hello, I just used the new GHC generics together with the DefaultSignatures extension to provide a default generic implementation for toJSON and parseJSON

Re: Associativity of the generic representation of sum types

2011-09-22 Thread Bas van Dijk
Hi José, I have another related question: (Excuse me for the big email, I had trouble making it smaller) I discovered a bug in my code that converts a product into a JSON value. I would like to convert products without field selectors into Arrays (type Array = Vector Value) and products with

Re: Associativity of the generic representation of sum types

2011-09-22 Thread Bas van Dijk
2011/9/22 Bas van Dijk v.dijk@gmail.com: What would make all this much easier is if the meta-information of constructors had a flag which indicated if it was a record or not. Could this be added? I just discovered the predicate: -- | Marks if this constructor is a record conIsRecord

Re: Associativity of the generic representation of sum types

2011-09-22 Thread Bas van Dijk
2011/9/22 Bas van Dijk v.dijk@gmail.com: I just discovered the predicate:  -- | Marks if this constructor is a record  conIsRecord :: t c (f :: * - *) a - Bool I think this can solve my problem. I think I have solved the bug now using conIsRecord. This is the new implementation: https

Re: Associativity of the generic representation of sum types

2011-09-22 Thread Bas van Dijk
2011/9/22 Bas van Dijk v.dijk@gmail.com: I will make an official ticket for this. Done: http://hackage.haskell.org/trac/ghc/ticket/5499 ___ Glasgow-haskell-users mailing list Glasgow-haskell-users@haskell.org http://www.haskell.org/mailman

Associativity of the generic representation of sum types

2011-09-21 Thread Bas van Dijk
Hello, I just used the new GHC generics together with the DefaultSignatures extension to provide a default generic implementation for toJSON and parseJSON in the aeson package: https://github.com/mailrank/aeson/pull/26 It appears that the generic representation of a sum type has a tree shape as

Re: How to synchronously shutdown the event manager loop

2011-08-31 Thread Bas van Dijk
On 31 August 2011 01:11, Bas van Dijk v.dijk@gmail.com wrote: So it seems like a bug in GHC. I will create a ticket in the morning. Ticket created: http://hackage.haskell.org/trac/ghc/ticket/5443 ___ Glasgow-haskell-users mailing list Glasgow

How to synchronously shutdown the event manager loop

2011-08-30 Thread Bas van Dijk
Hello, In my (still unreleased) usb-1.0 (https://github.com/basvandijk/usb) library I use the GHC event manager for managing events from the underlying `libusb` C library. To work with the library a user has to initialize it using: newCtx ∷ IO Ctx The `Ctx` then allows the user to see the USB

ghc fails to build due to trust issues

2011-08-30 Thread Bas van Dijk
Hello, I'm trying to build recent ghc-HEAD using ghc-7.2.1 but get the following error: libraries/filepath/System/FilePath/Internal.hs:81:1: base:Data.List can't be safely imported! The package (base) the module resides in isn't trusted. I guess a -trust base flag has to be passed to ghc

Re: ghc fails to build due to trust issues

2011-08-30 Thread Bas van Dijk
On 30 August 2011 23:57, austin seipp a...@hacks.yi.org wrote: 7.2.1 shipped without explicitly trusting the `base' package (an accident, IIRC.) You can fix this and resume your build by saying: $ ghc-pkg-7.2.1 trust base and everything should be OK. Thanks that works! Bas

Re: How to synchronously shutdown the event manager loop

2011-08-30 Thread Bas van Dijk
On 30 August 2011 17:39, Bryan O'Sullivan b...@serpentine.com wrote: On Tue, Aug 30, 2011 at 6:49 AM, Bas van Dijk v.dijk@gmail.com wrote: As you see I also kill the thread which is running the event manager loop. However I think this is not the right way to do it because when I use

Re: How to synchronously shutdown the event manager loop

2011-08-30 Thread Bas van Dijk
On 31 August 2011 00:15, Bas van Dijk v.dijk@gmail.com wrote: I see what I can do. I'm first going to export the 'finished' function from GHC.Event and use that to wait till the loop finishes and see if that solves my problem. Waiting till the loop finishes doesn't solve the problem

Re: Superclass defaults

2011-08-28 Thread Bas van Dijk
On 22 August 2011 10:10, Simon Peyton-Jones simo...@microsoft.com wrote: | I don't completely understant how does it work. Does client need to enable | language extension to get default instances? | | I think that the extension would only be required to *define them*, | not for them to be

Build failure of syb-with-class with ghc-7.2.1

2011-08-09 Thread Bas van Dijk
Hello, the HEAD of syb-with-class fails with the following error when build with ghc-7.2.1 and template-haskell-2.6: http://code.google.com/p/syb-with-class/issues/detail?id=4 Is this a bug in TH? Regards, Bas ___ Glasgow-haskell-users mailing list

Re: Build failure of syb-with-class with ghc-7.2.1

2011-08-09 Thread Bas van Dijk
On 9 August 2011 15:15, Sergei Trofimovich sly...@inbox.ru wrote: the HEAD of syb-with-class fails with the following error when build with ghc-7.2.1 and template-haskell-2.6: http://code.google.com/p/syb-with-class/issues/detail?id=4 Is this a bug in TH? Very likely:    

Re: GHC and Haskell 98

2011-06-20 Thread Bas van Dijk
On 20 June 2011 11:54, John Lato jwl...@gmail.com wrote: Is it easy to check, out of those 344, how many would build if the dependency on haskell98 were removed? You could write a script that will download them all, remove the haskell98 dep. and cabal build the package. (Bas, your link

Re: GHC and Haskell 98

2011-06-18 Thread Bas van Dijk
On 17 June 2011 16:47, Simon Peyton-Jones simo...@microsoft.com wrote: So:    Under Plan A, some Hackage packages will become un-compilable,       and will require source code changes to fix them.  I do not have        any idea how many Hackage packages would fail in this way. Of the 372

Re: Are FFI calls interruptible?

2011-04-24 Thread Bas van Dijk
On 24 April 2011 10:26, Edward Z. Yang ezy...@mit.edu wrote: No, you have to use the 'interruptible' keyword. Good, I need them to be uninterruptible. So I guess I can apply uninterruptibleMask_ only to the 'acquire lock' in the following code from my usb library:

Re: Are FFI calls interruptible?

2011-04-24 Thread Bas van Dijk
On 24 April 2011 18:58, Edward Z. Yang ezy...@mit.edu wrote: Well, that will result in a race where, if the foreign call gets interrupted, the asynchronous exception will get queued up and fire immediately once the FFI call completes, Well the whole block of code is under a mask_ so if FFI

Are FFI calls interruptible?

2011-04-23 Thread Bas van Dijk
Hello, Quick question: are safe/unsafe FFI calls interruptible? Thanks, Bas ___ Glasgow-haskell-users mailing list Glasgow-haskell-users@haskell.org http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

Re: C-- source highlighting using source-highlight

2011-04-15 Thread Bas van Dijk
On 14 April 2011 17:04, Johan Tibell johan.tib...@gmail.com wrote: I've thrown together a small source-highlight language file for C--. You can use it to e.g. highlight C-- code when piped through less. Nice! It would also be nice to have highlighted C-- output in ghc-core[1] too! Bas [1]

Fix context reduction stack overflow in dimensional

2011-03-29 Thread Bas van Dijk
Dear Bjorn, Attached is a patch that fixes a context reduction stack overflow in your dimensional package. I noticed something weird though (that's why I'm CCing the ghc list). When I cabal build dimensional-0.8.2 I first get the context reduction stack overflow when I then build it again I get

Re: 7.0.3

2011-03-17 Thread Bas van Dijk
On 15 March 2011 18:04, Ian Lynagh ig...@earth.li wrote: We want to keep the changes in this release to a minimum, to minimise the chance of regressions, but if you think we've missed any critical issues please let us know. Absolutely not critical but it would be nice if you could merge my

Re: ANNOUNCE: GHC 7.0.2 Release Candidate 2

2011-02-21 Thread Bas van Dijk
On 20 February 2011 22:16, Ian Lynagh ig...@earth.li wrote: We are pleased to announce the second release candidate for GHC 7.0.2 Congratulations! I may have found a bug (not sure if it's in ghc or cabal): $ cabal install unix-compat Resolving dependencies... Configuring unix-compat-0.2.1.1...

Re: Some patches for GHC

2011-01-05 Thread Bas van Dijk
On Fri, Dec 31, 2010 at 8:04 PM, Ian Lynagh ig...@earth.li wrote: On Wed, Dec 22, 2010 at 02:02:18PM +0100, Bas van Dijk wrote: I was just wondering if somebody could review (and hopefully apply) some of or all the patches in: http://hackage.haskell.org/trac/ghc/attachment/ticket/4834

Re: ANNOUNCE: GHC 7.0.2 Release Candidate 1

2010-12-26 Thread Bas van Dijk
On Thu, Dec 16, 2010 at 7:36 PM, Ian Lynagh ig...@earth.li wrote: We are pleased to announce the first release candidate for GHC 7.0.2:    http://www.haskell.org/ghc/dist/7.0.2-rc1/ This includes the source tarball, installers for OS X and Windows, and bindists for amd64/Linux, i386/Linux,

Some patches for GHC

2010-12-22 Thread Bas van Dijk
Hello, I was just wondering if somebody could review (and hopefully apply) some of or all the patches in: http://hackage.haskell.org/trac/ghc/attachment/ticket/4834/ghc_new_monad_hierarchy.dpatch Note that these patches are independent of the newly proposed monad hierarchy. Thanks, Bas

Re: ANNOUNCE: GHC 7.0.2 Release Candidate 1

2010-12-18 Thread Bas van Dijk
On Fri, Dec 17, 2010 at 7:58 PM, Ian Lynagh ig...@earth.li wrote: Can you tell me what these commands say, please?: Oops! The i386 version works so I guess I mistakenly assumed I was on a 64bit system. Sorry for the noise. In case you still want to know: uname -a Linux hfd

Re: ANNOUNCE: GHC 7.0.2 Release Candidate 1

2010-12-17 Thread Bas van Dijk
On Thu, Dec 16, 2010 at 7:36 PM, Ian Lynagh ig...@earth.li wrote: We are pleased to announce the first release candidate for GHC 7.0.2:    http://www.haskell.org/ghc/dist/7.0.2-rc1/ This includes the source tarball, installers for OS X and Windows, and bindists for amd64/Linux, i386/Linux,

Re: Functor = Applicative = Monad

2010-12-12 Thread Bas van Dijk
On Wed, Dec 1, 2010 at 10:02 AM, John Smith volderm...@hotmail.com wrote: Regarding recent concerns as to whether Pointed is actually useful (and if it is, is that Pointed Functors or pure Pointed?), how about a slightly more modest reform? class Functor f where    map :: (a - b) - f a - f b

Re: Functor = Applicative = Monad

2010-12-12 Thread Bas van Dijk
On Sun, Dec 12, 2010 at 12:48 PM, John Smith volderm...@hotmail.com wrote: There's a ticket at http://trac.haskell.org/haskell-platform/ticket/155, Thanks! But why create a ticket for the Haskell Platform? This is a change in the base library so we should follow the library submission process[1]

Re: [Haskell-cafe] Printing of asynchronous exceptions to stderr

2010-11-10 Thread Bas van Dijk
On Wed, Nov 10, 2010 at 10:50 AM, Mitar mmi...@gmail.com wrote: Hi! On Wed, Nov 10, 2010 at 8:54 AM, Bas van Dijk v.dijk@gmail.com wrote: A ThreadKilled exception is not printed to stderr because it's not really an error and should not be reported as such. So, how to make custom

Re: [Haskell-cafe] Printing of asynchronous exceptions to stderr

2010-11-10 Thread Bas van Dijk
On Wed, Nov 10, 2010 at 2:39 PM, Mitar mmi...@gmail.com wrote: Strange. It would help if you could show more of of your code. I am attaching a sample program which shows this. I am using 6.12.3 on both Linux and Mac OS X. And I run this program with runhaskell Test.hs. Without throwIO

Re: [Haskell-cafe] Printing of asynchronous exceptions to stderr

2010-11-09 Thread Bas van Dijk
On Tue, Nov 9, 2010 at 5:37 PM, Mitar mmi...@gmail.com wrote: Why is ThreadKilled not displayed by RTS when send to thread (and unhandled), but any other exception is? A ThreadKilled exception is not printed to stderr because it's not really an error and should not be reported as such. It is

Re: Forall and type synonyms in GHC 7.0

2010-11-01 Thread Bas van Dijk
On Mon, Nov 1, 2010 at 4:30 AM, Mario Blažević mblaze...@stilo.com wrote:     Before uploading a new version of my project on Hackage, I decided to future-proof it against GHC 7.0. I ran into several compile errors caused by the changes in let generalization, but these were easy to fix by

Re: Type error in GHC-7 but not in GHC-6.12.3

2010-10-31 Thread Bas van Dijk
(resending this to the list because this failed yesterday because of the mailinglist downtime) On Sat, Oct 30, 2010 at 1:57 AM, Bas van Dijk v.dijk@gmail.com wrote: I could isolate it a bit more if you want. And so I did. The following is another instance of the problem I'm having but set

Re: ANNOUNCE: GHC 7.0.1 Release Candidate 2

2010-10-30 Thread Bas van Dijk
On Sat, Oct 30, 2010 at 7:38 AM, Isaac Dupree m...@isaac.cedarswampstudios.org wrote: On 10/29/10 20:19, Bas van Dijk wrote: I'm not sure this is in rc2 since I'm using the latest ghc-HEAD (7.1.20101029). In ghc  7 you needed to import symbols like fromInteger, (=) and fail when you used

Type error in GHC-7 but not in GHC-6.12.3

2010-10-29 Thread Bas van Dijk
Hello, I'm updating my usb-safe package for GHC-7: darcs get http://code.haskell.org/~basvandijk/code/usb-safe It depends on the HEAD version of regions: darcs get http://code.haskell.org/~basvandijk/code/regions I think I'm suffering from the new implied MonoLocalBinds extension (I'm using

Re: Type error in GHC-7 but not in GHC-6.12.3

2010-10-29 Thread Bas van Dijk
On Fri, Oct 29, 2010 at 5:42 PM, Simon Peyton-Jones simo...@microsoft.com wrote: That looks odd. Can you isolate it for us?  The easiest thing is usually to start with the offending code: withDeviceWhich ∷  ∀ pr α  . MonadCatchIO pr  ⇒ USB.Ctx  → (USB.DeviceDesc → Bool)  → (∀ s.

Re: ANNOUNCE: GHC 7.0.1 Release Candidate 2

2010-10-29 Thread Bas van Dijk
I'm not sure this is in rc2 since I'm using the latest ghc-HEAD (7.1.20101029). In ghc 7 you needed to import symbols like fromInteger, (=) and fail when you used them indirectly. For example when using integer literals or do-notation. I noticed that in my ghc-HEAD this isn't needed anymore:

Re: What does interruptibility mean exactly?

2010-06-15 Thread Bas van Dijk
On Mon, Jun 14, 2010 at 11:20 PM, Don Stewart d...@galois.com wrote: v.dijk.bas: Hello, I've a short question about interruptible operations. In the following program is it possible for 'putMVar' to re-throw asynchronous exceptions even when asynchronous exception are blocked/masked?

Re: What does interruptibility mean exactly?

2010-06-15 Thread Bas van Dijk
On Tue, Jun 15, 2010 at 12:41 PM, Simon Marlow marlo...@gmail.com wrote: On 15/06/2010 09:00, Bas van Dijk wrote: On Mon, Jun 14, 2010 at 11:20 PM, Don Stewartd...@galois.com  wrote: v.dijk.bas: Hello, I've a short question about interruptible operations. In the following program

What does interruptibility mean exactly?

2010-06-14 Thread Bas van Dijk
Hello, I've a short question about interruptible operations. In the following program is it possible for 'putMVar' to re-throw asynchronous exceptions even when asynchronous exception are blocked/masked? newEmptyMVar = \mv - block $ putMVar mv x The documentation in Control.Exception about

Re: Proposal: priority queues in containers

2010-03-18 Thread Bas van Dijk
On Thu, Mar 18, 2010 at 4:43 PM, Louis Wasserman wasserman.lo...@gmail.com wrote:  Submit this package for canonicalization as part of the Haskell Platform. I would for one would support its inclusion. This is an option I seriously hadn't considered.  To be fair, that's because I've never

Re: Proposal: priority queues in containers

2010-03-18 Thread Bas van Dijk
On Thu, Mar 18, 2010 at 10:39 PM, Milan Straka f...@ucw.cz wrote: personally I am against splitting containers. It is a collection of several basic data structures with similar design decisions (reasonably efficient, can be used persistently, decent API). I think these structures should stay

Re: Associativity of ViewPatterns

2010-01-07 Thread Bas van Dijk
On Wed, Jan 6, 2010 at 5:34 PM, Simon Peyton-Jones simo...@microsoft.com wrote: Good point. I'll fix that, in HEAD at least. Thanks, BTW did you fix the infix instance headers problem in HEAD I previously mailed about? regards, Bas ___

Re: Associativity of ViewPatterns

2010-01-07 Thread Bas van Dijk
On Thu, Jan 7, 2010 at 11:02 AM, Simon Peyton-Jones simo...@microsoft.com wrote: Yes I did.  That too was an oversight. Thanks for pointing both out. Ok thanks (I asked just to make sure I don't have to create a ticket.) Bas ___ Glasgow-haskell-users

Associativity of ViewPatterns

2010-01-06 Thread Bas van Dijk
Hello, Why is the following a syntax error: f (view1 - view2 - pattern) = ... and the following isn't: f (view1 - (view2 - pattern)) = ... I would prefer the first version. regards, Bas ___ Glasgow-haskell-users mailing list

Re: Weird warnings when using ViewPatterns

2009-12-22 Thread Bas van Dijk
On Mon, Dec 21, 2009 at 10:17 PM, Bas van Dijk v.dijk@gmail.com wrote: On Mon, Dec 21, 2009 at 9:03 PM, Robert Greayer robgrea...@gmail.com wrote: There's been some improvement at least in 6.12.1, see: http://hackage.haskell.org/trac/ghc/ticket/2395 Thanks for pointing me to the ticket

Weird warnings when using ViewPatterns

2009-12-21 Thread Bas van Dijk
Hello, In my usb-safe[1] library I make extensive use of the ViewPatterns[2] language extension. However I get strange warnings when using them. See for example the following function: resetDevice ∷ (pr `ParentOf` cr, MonadIO cr) ⇒ RegionalDeviceHandle pr → cr () resetDevice

Re: Weird warnings when using ViewPatterns

2009-12-21 Thread Bas van Dijk
On Mon, Dec 21, 2009 at 9:03 PM, Robert Greayer robgrea...@gmail.com wrote: There's been some improvement at least in 6.12.1, see: http://hackage.haskell.org/trac/ghc/ticket/2395 Thanks for pointing me to the ticket! I'm emerging ghc-6.12.1 right now to try it out (I'm on Gentoo Linux).

Re: runhaskell rather than runghc

2007-09-30 Thread Bas van Dijk
On 9/30/07, Serge D. Mechveliani [EMAIL PROTECTED] wrote: Dear GHC and Cabal developers and users, I suggest to use `runhaskell' rather than `runghc'. Because it looks to have more sense, and also for political correctness. Cabal is a tool for `making' various Haskell implementations. In

Unknown option -XPatternSig used in warning

2007-09-19 Thread Bas van Dijk
`a' unless the pattern has a rigid type context In the pattern: x :: a In the definition of `foo': foo (x :: a) = x Which I expect. Should I file a bug report, or is there an easy fix? regards, Bas van Dijk ___ Glasgow-haskell-users

Re: Unknown option -XPatternSig used in warning

2007-09-19 Thread Bas van Dijk
On 9/19/07, Simon Peyton-Jones [EMAIL PROTECTED] wrote: I believe this is a known problem with OPTIONS_GHC, and will work on the command line. I think Ian is working on it. Ian? Via the command line I get the same problem: $ ghci -XPatternSigs PatternSig.hs GHCi, version 6.7.20070915:

Re: Unknown option -XPatternSig used in warning

2007-09-19 Thread Bas van Dijk
On 9/19/07, Simon Peyton-Jones [EMAIL PROTECTED] wrote: ...I'll push a fix. Thanks! It works now: $ ghci -XPatternSignatures PatternSig.hs GHCi, version 6.9.20070919: http://www.haskell.org/ghc/ :? for help Loading package base ... linking ... done. [1 of 1] Compiling Main (

Re: Unknown option -XPatternSig used in warning

2007-09-19 Thread Bas van Dijk
On 9/19/07, Wolfgang Jeltsch [EMAIL PROTECTED] wrote: You should use {-# LANGUAGE PatternSigs #-} That should be: {-# LANGUAGE PatternSignatures #-} It would indeed be better if GHC could print Use LANGUAGE pragma with extension... like Wolfram mentioned. Bas

Re: Error compiling GHC/Num.lhs

2007-05-03 Thread Bas van Dijk
-linux): mkWWcpr: not a product base:Data.Typeable.TypeRep{tc r3eN} What can be the problem? regards, Bas van Dijk ___ Glasgow-haskell-users mailing list Glasgow-haskell-users@haskell.org http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

Re: Error compiling GHC/Num.lhs

2007-05-03 Thread Bas van Dijk
On 5/3/07, Simon Peyton-Jones [EMAIL PROTECTED] wrote: I think I have fixed it... You did, thanks very much! GHC now builds and install without any errors, jippy! Thanks, Bas van Dijk ___ Glasgow-haskell-users mailing list Glasgow-haskell-users

  1   2   >