Re: [Haskell] Please help me to reconstruct the Yarrow website! Re: New haskell.org server

2010-12-14 Thread Taral
shut down the old server on Jan 31, 2011.  Hopefully this will give everyone adequate time to move their files. Oh, for goodness' sake. Put a tarball somewhere and I'll put up a mirror for the laggards. It can stay there for years for all I care. -- Taral tar...@gmail.com Please let me know

Re: [Haskell] Please help me to reconstruct the Yarrow website! Re: New haskell.org server

2010-12-11 Thread Taral
, and you're the only one complaining like this. Take a backup of the site with wget and fix it when you have time. -- Taral tar...@gmail.com Please let me know if there's any further trouble I can give you.     -- Unknown ___ Haskell mailing list

[Haskell-cafe] Re: [Coq-Club] An encoding of parametricity in Agda

2009-09-23 Thread Taral
, there's no attempt to prove that: forall (P Q : forall a, a - a), P = Q. which is what parametricity means to me. -- Taral tar...@gmail.com Please let me know if there's any further trouble I can give you. -- Unknown ___ Haskell-Cafe mailing list

Re: [Haskell-cafe] Re: [Haskell] [ANN] Safe Lazy IO in Haskell

2009-05-19 Thread Taral
On Mon, May 18, 2009 at 10:06 PM, Ryan Ingram ryani.s...@gmail.com wrote: On Mon, May 18, 2009 at 3:05 PM, Taral tar...@gmail.com wrote: Will this do? (=) :: (NFData sa, NFData b) = LI sa - (sa - LI b) - LI b No, the problem is that = on monads has no constraints, it must have the type LI

[Haskell-cafe] Re: [Haskell] [ANN] Safe Lazy IO in Haskell

2009-05-18 Thread Taral
On Mon, May 18, 2009 at 10:30 AM, Nicolas Pouillard nicolas.pouill...@gmail.com wrote: The type I would need for bind is this one:  (=) :: NFData sa = LI sa - (sa - LI b) - LI b Will this do? (=) :: (NFData sa, NFData b) = LI sa - (sa - LI b) - LI b -- Taral tar...@gmail.com Please let me

Re: [Haskell] ANNOUNCE: jhc 0.6.0 Haskell Compiler

2009-03-23 Thread Taral
On Sat, Mar 21, 2009 at 10:00 AM, Don Stewart d...@galois.com wrote: Util/Gen.hs:6:7:    Could not find module `Control.Monad.Identity':      it was found in multiple packages: transformers-0.1.1.0 mtl-1.1.0.2 make[1]: *** [jhc] Error 1 ghc-pkg hide transformers-0.1.1.0 -- Taral tar

Re: [Haskell-cafe] Termination of substitution

2008-03-12 Thread Taral
On 3/12/08, Neil Mitchell [EMAIL PROTECTED] wrote: However, I don't believe this expression is type safe in Haskell. Using higher-order polymorphism: f (x :: forall a. a - a) = x x -- Taral [EMAIL PROTECTED] Please let me know if there's any further trouble I can give you. -- Unknown

Re: [Haskell-cafe] Re: fast integer base-2 log function?

2008-02-27 Thread Taral
On 2/27/08, Chad Scherrer [EMAIL PROTECTED] wrote: Is {-# LANGUAGE MagicHash #-} documented somewhere? I've seen it referenced a few times now, but I can't find any details about it. No. http://hackage.haskell.org/trac/ghc/ticket/1297 -- Taral [EMAIL PROTECTED] Please let me know if there's

Re: [Haskell-cafe] Graphical graph reduction

2008-02-25 Thread Taral
) (nth (- n 1) (tail xs (t nil))) -- Taral [EMAIL PROTECTED] Please let me know if there's any further trouble I can give you. -- Unknown ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Haskell w/ delimited continuations

2008-02-23 Thread Taral
evaluation order, amongst other things. Hm... thank you very much! -- Taral [EMAIL PROTECTED] Please let me know if there's any further trouble I can give you. -- Unknown ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman

Re: [Haskell-cafe] Haskell w/ delimited continuations

2008-02-23 Thread Taral
On Sat, Feb 23, 2008 at 1:05 AM, [EMAIL PROTECTED] wrote: reset ((\x - x + x) (shift f f)) This one doesn't typecheck, since you can't unify the types (a - r) and r. -- Taral [EMAIL PROTECTED] Please let me know if there's any further trouble I can give you. -- Unknown

[Haskell-cafe] Haskell w/ delimited continuations

2008-02-22 Thread Taral
My understanding of these things is limited, but what would stop me, theoretically speaking, of making a version of ghc with these primitives added: type Prompt r reset :: (Prompt r - r) - r shift :: Prompt r - ((a - _) - r) - a (Where _ is either r or forall b. b) -- Taral [EMAIL PROTECTED

[Haskell-cafe] Re: Haskell w/ delimited continuations

2008-02-22 Thread Taral
On 2/22/08, Taral [EMAIL PROTECTED] wrote: reset :: (Prompt r - r) - r shift :: Prompt r - ((a - _) - r) - a The point of the question is about shift/reset with *these types*. I know there are implementations with other types. -- Taral [EMAIL PROTECTED] Please let me know if there's any

Re: [Haskell-cafe] Re: Haskell w/ delimited continuations

2008-02-22 Thread Taral
created using these primitives? -- Taral [EMAIL PROTECTED] Please let me know if there's any further trouble I can give you. -- Unknown ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Re: Haskell w/ delimited continuations

2008-02-22 Thread Taral
On 2/22/08, Derek Elkins [EMAIL PROTECTED] wrote: shift and reset I was under the impression that reset was a pure function. What side effects does it have? -- Taral [EMAIL PROTECTED] Please let me know if there's any further trouble I can give you. -- Unknown

[Haskell-cafe] Re: Haskell w/ delimited continuations

2008-02-22 Thread Taral
On 2/22/08, Taral [EMAIL PROTECTED] wrote: shift :: Prompt r - ((a - _) - r) - a (Where _ is either r or forall b. b) It occurs to me that _ has to be r, otherwise the subcontinuation can escape. -- Taral [EMAIL PROTECTED] Please let me know if there's any further trouble I can give you

Re: [Haskell] detecting existing instances

2008-01-09 Thread Taral
assertions that t is an instance of B (B t), it does *not* provide assertions that t is not an instance of B. This is because an instance of B can be declared by other modules at a later point (e.g. by someone who imports your module). -- Taral [EMAIL PROTECTED] Please let me know if there's any

Re: [Haskell] Re: Haskell Digest, Vol 52, Issue 1

2007-12-04 Thread Taral
. What's to prevent it doing that? Look at the translation: newIVar = (\x - let y = readIVar x in writeIVar x 3 print y) y can't be floated out because it depends on x. -- Taral [EMAIL PROTECTED] Please let me know if there's any further trouble I can give you. -- Unknown

Re: [Haskell] Nested guards?

2007-12-04 Thread Taral
properties. You'd have to clone the server _ clause into the x clause. -- Taral [EMAIL PROTECTED] Please let me know if there's any further trouble I can give you. -- Unknown ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org

Re: [Haskell] Nirvana

2007-07-27 Thread Taral
into a significantly more useful programming language. -- Taral [EMAIL PROTECTED] Please let me know if there's any further trouble I can give you. -- Unknown ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

Re: [Haskell] Power series in a nutshell

2007-07-12 Thread Taral
On 7/12/07, Doug McIlroy [EMAIL PROTECTED] wrote: http://www.cs.dartmouth.edu/~doug/powser.html Very nice. I would only recommend that you include: scale k f = map (k*) f and have (*) use it. Thanks for your contribution! -- Taral [EMAIL PROTECTED] Please let me know if there's any further

Re: [Haskell] ANNOUNCE: Haskell Communities Activities Report (12th ed., May 2007)

2007-05-31 Thread Taral
reading about the interesting things everyone else is up to. Hear, hear. Thank you very much Andres! -- Taral [EMAIL PROTECTED] Please let me know if there's any further trouble I can give you. -- Unknown ___ Haskell mailing list Haskell@haskell.org http

Re: [Haskell-cafe] global variables

2007-05-24 Thread Taral
On 5/24/07, Adrian Hey [EMAIL PROTECTED] wrote: Taral wrote: The other syntaxes proposed don't strike me as sufficiently rigorous. Me neither. It's always been a great source of puzzlement to me why this very simple and IMO conservative proposal should be so controversial. Unless someone can

Re: [Haskell-cafe] global variables

2007-05-24 Thread Taral
On 5/24/07, Adrian Hey [EMAIL PROTECTED] wrote: Taral wrote: The other syntaxes proposed don't strike me as sufficiently rigorous. Me neither. It's always been a great source of puzzlement to me why this very simple and IMO conservative proposal should be so controversial. Unless someone can

Re: [Haskell-cafe] global variables

2007-05-23 Thread Taral
rigorous. -- Taral [EMAIL PROTECTED] Please let me know if there's any further trouble I can give you. -- Unknown ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell] not-so-newbie question

2007-05-20 Thread Taral
, it complains that I don't have a gcc on my machine... -- Taral [EMAIL PROTECTED] Please let me know if there's any further trouble I can give you. -- Unknown ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

Re: [Haskell] not-so-newbie question

2007-05-20 Thread Taral
applications for Mac, you need to know the OS. And the OS is a UNIX. On 5/20/07, Taral [EMAIL PROTECTED] wrote: You need to install Xcode (from your Mac OS disk) before you can use ghc. -- Taral [EMAIL PROTECTED] Please let me know if there's any further trouble I can give you. -- Unknown

Re: Wanted: warning option for usages of unary minus

2007-05-17 Thread Taral
as unfriendly to Fortran programmers. [breaking cc list] Would this kind of thing be eligible for Haskell'? I never had a problem with _1 in APL-type languages... and I think it's best to be very clear about intent. -- Taral [EMAIL PROTECTED] Please let me know if there's any further trouble I

Re: [Haskell] Haskell fast (?) arrays

2007-05-01 Thread Taral
consuming. I personally recommend to people that if sections of your code are really performance-critical, you should consider writing them in a lower-level lanaguage like C and using FFI for access. P.S. I wonder if jhc could improve the output code? -- Taral [EMAIL PROTECTED] You can't prove anything

Re: [Haskell] Google SoC - student allocations

2007-04-11 Thread Taral
. (These sets may continue to grow.) Congratulations to all the students. Darcs Con[f]lict Handling Yay! Rewrite the typechecker for YHC and nhc98 Yay again! Update the Hat tracer YAY! Ok done now. :D -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem

[Haskell] Crazy class stuff

2007-03-13 Thread Taral
express it right? -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: Crazy class stuff

2007-03-13 Thread Taral
On 3/13/07, Taral [EMAIL PROTECTED] wrote: And it doesn't work. I know what I want it to do, how do I express it right? This is closer, but still doesn't work: class (Monad i, Monad o) = MonadTrans' i o where lift' :: i a - o a instance Monad m = MonadTrans' m m where lift' = id

[Haskell] Re: Crazy class stuff

2007-03-13 Thread Taral
On 3/13/07, Taral [EMAIL PROTECTED] wrote: This is closer, but still doesn't work: And this works, and I don't know why: class MonadTrans' i o where lift' :: (Monad i, Monad o) = i a - o a instance Monad m = MonadTrans' m m where lift' = id instance (MonadTrans t, Monad b, MonadTrans

Re: [Haskell] Generator Function for Prime Numbers

2007-03-12 Thread Taral
have verified that the generator function works. But I haven't found any confirmation by googling. Has anyone got wind of this? Thanks, Dave Feustel ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell -- Taral

Re: [Haskell] Laziness and the IO Monad (randomness)

2007-03-01 Thread Taral
On 3/1/07, Dave Tapley [EMAIL PROTECTED] wrote: My question asks why this is the case, when laziness should ensure only the first 10 cases need to be computed. Basically, because the IO monad is strict, not lazy. If you want laziness, don't use the IO monad. -- Taral [EMAIL PROTECTED] You

Re: List syntax (was: Re: help from the community?)

2007-02-03 Thread Taral
, for example. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-prime mailing list Haskell-prime@haskell.org http://www.haskell.org/mailman/listinfo/haskell-prime

Re: help from the community?

2007-01-31 Thread Taral
. The layout rule never generates empty braces. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-prime mailing list Haskell-prime@haskell.org http://www.haskell.org/mailman/listinfo/haskell-prime

[Haskell-cafe] Re: [Haskell] Re: state of HaXml?

2007-01-10 Thread Taral
, this shouldn't matter, however on some platforms an open file handle can prevent deletion of the file. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http

Re: [Haskell] Re: state of HaXml?

2007-01-06 Thread Taral
- IO.hGetContents handle let len = length contents seq len $ IO.hClose handle return $ XP.xmlParse fn contents This works, because to get the head of len (an integer) you need the whole of contents. -- Taral [EMAIL PROTECTED] You can't prove anything

Re: [Haskell] Announce: CalDims 1.0 (RC 1) - A calculator aware of units

2006-12-19 Thread Taral
On 12/19/06, mm [EMAIL PROTECTED] wrote: i'd like to inform you about the first announced version of CalDims. Its website is in the haskellwiki: http://www.haskell.org/haskellwiki/CalDims Neat! It's like units, but in Haskell. -- Taral [EMAIL PROTECTED] You can't prove anything

Re: [Haskell-cafe] Dynamic types through unsafeCoerce

2006-12-13 Thread Taral
. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Dynamic types through unsafeCoerce

2006-12-13 Thread Taral
On 12/13/06, Alfonso Acosta [EMAIL PROTECTED] wrote: deactivate :: Maybe(hd - IO ()), According to the spec, NULL here means no-op. So instead of using Maybe, just set deactivate = \_ - return () if you see NULL. -- Taral [EMAIL PROTECTED] You can't prove anything

Re: [Haskell-cafe] Dynamic types through unsafeCoerce

2006-12-13 Thread Taral
On 12/13/06, Taral [EMAIL PROTECTED] wrote: Second, you don't want the consumer to pick the hd type. If you're willing to accept extensions (I think you are), make it existential: data Descriptor = forall hd. Descriptor { ... } This will ensure that you can't pass the handles from one plugin

Re: [Haskell-cafe] Dynamic types through unsafeCoerce

2006-12-13 Thread Taral
On 12/13/06, Alfonso Acosta [EMAIL PROTECTED] wrote: I don't see what you mean here. I'm not using ForeignPtrs at all. ... you're *writing* a plugin, not using one. Oh. Um... let me think about that one. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem

Re: [Haskell-cafe] Type problem with simple takusen code (was: Trivialdatabase access in Haskell)

2006-12-12 Thread Taral
... There should be a README or INSTALL file in the original tarball that explains how to do that. I suspect it is a flag you have to pass to runhaskell Setup.lhs configure. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem

Re: [Haskell-cafe] Dynamic types through unsafeCoerce

2006-12-12 Thread Taral
On 12/12/06, Alfonso Acosta [EMAIL PROTECTED] wrote: So it would be great to be able to use unsafeCoerce. It would be great -- but Typeable is the only way to get *safe* typecasts of this type. Otherwise, you may as well run without a typechecker. -- Taral [EMAIL PROTECTED] You can't prove

Re: [Haskell-cafe] Aim Of Haskell

2006-12-11 Thread Taral
On 12/11/06, Nia Rium [EMAIL PROTECTED] wrote: In my humble opinion, in this context, GUI doesn't mean a library to implement a GUI application. It rather means an interpreter/compiler that provides graphical interface. Windows users can use Visual Haskell... -- Taral [EMAIL PROTECTED] You

Re: [Haskell-cafe] Aim Of Haskell

2006-12-11 Thread Taral
On 12/11/06, Philippa Cowderoy [EMAIL PROTECTED] wrote: Only those who already have Visual Studio, no? Yes, that is an unfortunate limitation. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-Cafe

Re: [Haskell-cafe] Trivial database access in Haskell

2006-12-11 Thread Taral
commands are: runhaskell Setup.lhs configure runhaskell Setup.lhs build runhaskell Setup.lhs install -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http

Re: [Haskell-cafe] Dynamic types through unsafeCoerce

2006-12-09 Thread Taral
that you're casting Dynamic back to the original type. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Dynamic types through unsafeCoerce

2006-12-09 Thread Taral
unsafeCoerce a dangerous operation? Sure it is. The type you gave (MyType Int Char - MyType a b) can easily crash your program. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-Cafe mailing list Haskell-Cafe

Re: Re: [Haskell-cafe] interval arithmetic for integers?

2006-12-08 Thread Taral
On 12/8/06, Nicolas Frisby [EMAIL PROTECTED] wrote: I did see that one on the wiki; but it doesn't seem to support the open intervals (i.e. (-inf, 3)) and I'd really like those. Oh, it does. See BoundaryAboveAll and BoundaryBelowAll. -- Taral [EMAIL PROTECTED] You can't prove anything

Re: [Haskell] Network accept loop with graceful shutdown implementation

2006-12-07 Thread Taral
. If you need to *wait* for an asynchronous exception, then you shouldn't be using them at all. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org

Re: [Haskell-cafe] interval arithmetic for integers?

2006-12-07 Thread Taral
)? A possible complication is that I'm hoping to include open intervals such as (GreaterEqThan 3). -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http

Re: [Haskell-cafe] (a - [b]) - [a - b] ?

2006-12-04 Thread Taral
On 12/4/06, Joachim Breitner [EMAIL PROTECTED] wrote: \g - map (\n a - g a !! n) [1..] I think that's about as good as it gets. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-Cafe mailing

Re: [Haskell] ANNOUNCE: Another Haskell MIME Library

2006-12-02 Thread Taral
on that code instead. WASH has one, and I uploaded mine to http://www.taral.net/mime.tar.gz for people to look at and use. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell mailing list Haskell@haskell.org

Re: [Haskell-cafe] Generate 50 random coordinates

2006-12-01 Thread Taral
On 12/2/06, Huazhi (Hank) Gong [EMAIL PROTECTED] wrote: myrand :: Int myrand = randomRIO(1::Int, 100) rf=[(myrand, myrand) | a - [1..50]] do let myrand = randomRIO (1 :: Int, 100) rf - replicateM 50 (liftM2 (,) myrand myrand) -- Taral [EMAIL PROTECTED] You can't prove anything

Re: [Haskell-cafe] Functional GUI combinators for arbitrary graphs of components?

2006-12-01 Thread Taral
know where to look or what to search for. I suggest you check the Functional Graph Library (FGL). It's shipped as part of GHC. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-Cafe mailing list Haskell

Re: [Haskell-cafe] How to get subset of a list?

2006-11-30 Thread Taral
. If you're trying to do random access on a list, you should rethink why you're using a list. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http

Re: [Haskell-cafe] Draft MissingH Reorg Plan

2006-11-30 Thread Taral
throw in my haskell MIME parser if you want it. It's not the same as the one that most people use -- but I like it better. :) -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-Cafe mailing list Haskell-Cafe

Re: [Haskell-cafe] strange type mismatch when trying to use takusen

2006-11-23 Thread Taral
the $ and you'll be fine. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell] Pugs gains SMP parallelism support.

2006-10-23 Thread Taral
(1) random access for the writers to put their results in efficiently. And newArray_ should be faster than N copies of newEmptyMVar. It is true that I have one congestion point (the semaphone) instead of N (the mvars). -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence

Re: [Haskell] Pugs gains SMP parallelism support.

2006-10-23 Thread Taral
? It's possible that the array approach wins when you try to process 100,000 elements. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman

Re: [Haskell] Pugs gains SMP parallelism support.

2006-10-22 Thread Taral
? The IO monad is strict, so the computations should be done in parallel... -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

Re: Indentation of If-Then-Else

2006-10-22 Thread Taral
indentation does nothing to improve readability, and is a common frustration. The point of all sugar is to reduce frustration, so I am strongly in favor of the new syntax. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem

Re: [Haskell] Pugs gains SMP parallelism support.

2006-10-21 Thread Taral
sequence_ $ zipWith proc [0..] xs waitQSemN count l elems $ unsafeFreeze arr STM might work better than a QSemN... -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell mailing list Haskell@haskell.org http

Re: [Haskell] Pugs gains SMP parallelism support.

2006-10-21 Thread Taral
On 10/21/06, Audrey Tang [EMAIL PROTECTED] wrote: let proc n x = do Hmm, am I missing something here, but how does forkIO (and data parallelism) fit in into that scheme? I R DUM. let proc n x = forkIO $ do -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence

Re: Standard syntax for preconditions, postconditions, and invariants

2006-10-19 Thread Taral
be implemented requirement for major features. However, it seems that Haskell' is a good way to get people thinking about future improvements, and I'd hate to stifle that. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem

Re: [Haskell] Haskell web forum

2006-09-20 Thread Taral
languages out there with no web forum. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

Re: [Haskell] Haskell web forum

2006-09-20 Thread Taral
On 9/20/06, Niklas Broberg [EMAIL PROTECTED] wrote: It is much easier to keep conversations in context in a forum, and to search for old conversations. It's all there, all the time. Eh, I don't have this problem. I use gmail. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's

Re: [Haskell] Deferred instance declarations (serialization of existential boxes)

2006-09-20 Thread Taral
instances for it. Can you define instance Cxt a = Read (Box a)? If not, then you need typecase and Haskell does not really support that. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell mailing list

[Haskell-cafe] Re: Re[2]: [Haskell] Proposal: unification of style of function/data/type/class definitions

2006-09-11 Thread Taral
it? In my mind, the current mode is a functional one: Eq :: Eq t = Expr t - Expr t - Expr Bool And this is perfectly readable. The arrow means that the argument is an implicit propositional one, but it's still an argument. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's

Re: [Haskell-cafe] Re: Re[2]: [Haskell] Proposal: unification of styleof function/data/type/class definitions

2006-09-11 Thread Taral
on a variable in scope. Type signatures have implicit variables. Also, there's no way for the guard to fall through or anything like that. It's just not similar enough for me. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem

Re: [Haskell] Proposal: unification of style of function/data/type/class definitions

2006-09-10 Thread Taral
... -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

Re: [Haskell] Re: ANN: Haskell98 termination analyzer (AProVE)

2006-09-08 Thread Taral
On 9/8/06, Bill Wood [EMAIL PROTECTED] wrote: We await the response with bated breath. Don't hold your breath. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell mailing list Haskell@haskell.org http

Re: map and fmap

2006-08-28 Thread Taral
of the underlying collection (hence the numerous fold* functions), map is not. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-prime mailing list Haskell-prime@haskell.org http://www.haskell.org/mailman

Re: Re[8]: All Monads are Functors

2006-08-16 Thread Taral
Functor comes into scope via import. The current proposal to require people to write instance Functor isn't so pretty as the hierarchy becomes more fine-grained: instance Monad [] where instance Functor instance PointedFunctor instance Applicative ... -- Taral [EMAIL PROTECTED] You

Re: Re[2]: All Monads are Functors

2006-08-14 Thread Taral
: module A contains instance Monad [] module B contains instance Functor [] module C imports A and B. Do we complain about a duplicate instance declarations? If not, does the use of fmap in A use the default definition, or the one from B? -- Taral [EMAIL PROTECTED] You can't prove anything

Re: [Haskell] thread-local variables

2006-08-06 Thread Taral
:: IODynamicRef a - a - IO b - IO b -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

Re: [Haskell] ANN: monadic probabilistic functional programing

2006-07-21 Thread Taral
On 7/19/06, Stefan Karrmann [EMAIL PROTECTED] wrote: Unfortunatly, darcs does not provide a method to extract patches as far as I know. (Hints are welcomed.) darcs diff and darcs annotate. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem

Re: [Haskell] using the ffi with callbacks

2006-07-21 Thread Taral
/export trick described by Anatoly or you can just construct the FunPtr in main or an unsafePerformIO CAF. (We need a constructor syntax for top-level objects requiring IO!) -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem

Re: [Haskell] using the ffi with callbacks

2006-07-20 Thread Taral
(cb, ds) - deRefStablePtr sp freeStablePtr sp freeHaskellFunPtr cb -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

Re: [Haskell] crash unsafeperformio stm

2006-07-11 Thread Taral
newTVarIO, but I'm not sure about TMVars. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

Re: [Haskell] crash unsafeperformio stm

2006-07-11 Thread Taral
On 7/12/06, Taral [EMAIL PROTECTED] wrote: Because atomically doesn't like unsafePerformIO. In more detail: atomically is not re-entrant. You could try something like: main = a `seq` do ... to make sure that you don't re-enter the STM subsystem and crash. -- Taral [EMAIL PROTECTED] You

Re: Nested Guards

2006-07-01 Thread Taral
or interpreter. Perhaps this could be forwarded onto the GHC and other compiler people for consideration as an extension? -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-prime mailing list Haskell-prime@haskell.org

Re: [Haskell] Google SoC: Software Transactional Memory for Parrot

2006-06-27 Thread Taral
of generics, subclassing, and virtual dispatch. However, ... Am I the only one whose first instinct upon reading this is EW!? -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell mailing list Haskell@haskell.org

Re: [Haskell] ANNOUNCE: Haskell Communities Activities Report(10thed., June 2006)

2006-06-13 Thread Taral
and started reading it -- it is an impressive work with some *very* interesting projects I had no idea were out there! Thank you! -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell mailing list Haskell

Re: [Haskell] (.) . (.)

2006-05-28 Thread Taral
On 5/28/06, Dominic Steinitz [EMAIL PROTECTED] wrote: Is this defined in some library? Thanks, Dominic. Don't think so. I use: \a b - f (g a b) -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell

Re: [Haskell] installing streams library

2006-05-21 Thread Taral
to have been overlooked is that different people will execute these commands differently: ./configure --prefix=/opt/freeware --sysconfdir=/etc --disable-nls make make install DESTDIR=/home/taral/staging Many people will run make install as root but the main compile as non-root. You can't blindly

Re: [Haskell] Ambiguous type variable when using Data.Generic

2006-05-20 Thread Taral
(simplify :: HsExp - HsExp)) . everywhere (mkT (simplify :: HsPat - HsPat)) . everywhere (mkT (simplify :: HsRhs - HsRhs)) Of course, that's not any simpler. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem

Re: [Haskell] Ambiguous type variable when using Data.Generic

2006-05-20 Thread Taral
On 5/20/06, Bas van Dijk [EMAIL PROTECTED] wrote: simplifyExp (HsLeftSection e op)= HsApp (opToExp op) e simplifyExp (HsRightSection op e) = HsApp (opToExp op) e By the way, I think this looks wrong. One of these needs to create a lambda expression. -- Taral [EMAIL PROTECTED

Re: Class System current status

2006-05-11 Thread Taral
on what level of *minimum* termination support Haskell' will insist upon. The CHR paper (with the confluence improvements by Claus) is currently the most promising option, and has an implementation (another important consideration) in GHC. -- Taral [EMAIL PROTECTED] You can't prove anything

Re: A modest proposal

2006-04-16 Thread Taral
On 4/15/06, John Goerzen [EMAIL PROTECTED] wrote: On the downside, this means that I couldn't just say: take 5 mylist I'd instead have to write: take (5::Int) mylist Wouldn't defaulting do this? -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem

Re: FFI, safe vs unsafe

2006-04-12 Thread Taral
... returnsquickly? Hear, hear: fast - takes very little time to execute pure - side-effect free nocallback - does not call back into Haskell -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-prime mailing

Re: preemptive vs cooperative: attempt at formalization

2006-04-11 Thread Taral
was thinking that it might be more useful to express it programatically: if preemptive then fork _|_ return () = () -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-prime mailing list Haskell-prime@haskell.org

Re: deeqSeq proposal

2006-04-04 Thread Taral
is this necessary? -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-prime mailing list Haskell-prime@haskell.org http://haskell.org/mailman/listinfo/haskell-prime

Re: Concurrency

2006-03-31 Thread Taral
single ones. Can we please have something like: threadWait :: Timeout - [Handle] - IO ? -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-prime mailing list Haskell-prime@haskell.org http://haskell.org

Re: FFI, safe vs unsafe

2006-03-29 Thread Taral
concurrent -- the hard one {- nothing -} Can I suggest sef in this? Most cases of unsafe are actually claims that the call is side-effect free. -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell

Re: Re[2]: important news: refocusing discussion

2006-03-27 Thread Taral
/orElse? -- Taral [EMAIL PROTECTED] You can't prove anything. -- Gödel's Incompetence Theorem ___ Haskell-prime mailing list Haskell-prime@haskell.org http://haskell.org/mailman/listinfo/haskell-prime

Re: Re[2]: Strict tuples

2006-03-22 Thread Taral
refers to the idea that somehow such strictness annotations are (a) required at the type level and (b) required at all to enable such optimization. I believe the optimization happens without any annotation from the user, and it should stay that way. -- Taral [EMAIL PROTECTED] You can't prove anything

  1   2   >