Re: Using -fext-core without a Main function

2010-04-16 Thread Hal Daume III
is actually called Main and hence insists on a main declaration. mbolingbr...@perihelion ~/tmp $ ghc -c Hal.hs Hal.hs:1:0: The function `main' is not defined in module `Main' Compile this instead: module Hal where addOne x = x + 1 Cheers, Max On 13 April 2010 17:38, Hal Daume III h

Using -fext-core without a Main function

2010-04-13 Thread Hal Daume III
tried adding -no-hs-main but that doesn't help. I can add 'main = undefined' to Foo.hs, but then the core file doesn't contain the declaration of addOne because it's not used. Any suggestions? Thanks! -h -- Hal Daume III --- me AT hal3 DOT name | http://www DOT hal3 DOT name Arrest

[Haskell] need some help with type inference

2007-11-15 Thread Hal Daume III
, - Hal p.s., the language is here: http://www.cs.utah.edu/~hal/HBC -- Hal Daume III --- me AT hal3 DOT name | http://hal3.name Arrest this man, he talks in maths. | http://nlpers.blogspot.com ___ Haskell mailing list Haskell@haskell.org http

missing Control.Monad.State

2007-11-11 Thread Hal Daume III
turn up anything called State, either. I presume that I'm doing something incredibly stupid, but I'd appreciate a bit of help! Thanks! - Hal -- Hal Daume III --- me AT hal3 DOT name | http://hal3.name Arrest this man, he talks in maths. | http://nlpers.blogspot.com

Re: [Haskell-cafe] formal methods functional programming

2006-01-15 Thread Hal Daume III
I confess I haven't really been following this discussion, but a friend of mine has a recent paper that might be of interest (though it deals with ML rather than Haskell)... http://math.andrej.com/2005/04/09/specifications-via-realizability/ -- Hal Daume III

Re: [Haskell-cafe] Problems with square root...

2005-12-21 Thread Hal Daume III
as (round sqrt) 2 and round sqrt doesn't make sense. x(y) doesn't mean necessarily apply y to x as it does in C. parens only are used as they are in math to separate stuff. -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths

Re: [Haskell-cafe] Re: Tutorial uploaded

2005-12-21 Thread Hal Daume III
, and 1-11 are getting started with Hugs and so on. One of the whole points of YAHT is to introduce it early. -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume

Re: [Haskell-cafe] Proposal for a first tutorial.

2005-12-20 Thread Hal Daume III
better, I got somewhat annoyed. -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org

Re: [Haskell-cafe] Writing functions in Haskell.

2005-04-29 Thread Hal Daume III
sure the questions will still arise. -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org

Re: [Haskell-cafe] Writing functions in Haskell.

2005-04-28 Thread Hal Daume III
-- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell] Proposal: Allow \= for field update in record update syntax

2005-02-17 Thread Hal Daume III
/listinfo/haskell -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

Re: [Haskell-cafe] Re: Processing of large files

2004-11-03 Thread Hal Daume III
/haskell-cafe -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: [Haskell-cafe] Writing binary files?

2004-09-11 Thread Hal Daume III
and Improved Yahoo! Mail - Send 10MB messages! http://promotions.yahoo.com/new_mail ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe -- Hal Daume III | [EMAIL

main thread GC'd on ^C

2004-08-13 Thread Hal Daume III
it doesn't just exit gracefully, or print Control-C caught or something like that? (9:38am strontium:ACE/ ghc --version The Glorious Glasgow Haskell Compilation System, version 6.2.1) - Hal -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks

Re: [Haskell] image writing library

2004-08-05 Thread Hal Daume III
$ bounds cm maxval = maximum (elems cm) Not *very* beautiful, but seems to do the job for my stuff. I'll try the PPM library if I need something a tad more fancy - like colors :-) Thanks for the suggestions! -ketil -- Hal Daume III | [EMAIL

Double - CDouble, realToFrac doesn't work

2004-08-03 Thread Hal Daume III
:: Double) / 0 NaN Prelude Foreign.C realToFrac ((0 :: Double) / 0) :: CDouble -Infinity yikes! the NaN got turned into a -Infinity!!! aside from manually checking for 'strange' Double/CDouble values and wrapping realToFrac, is there a better way? also, does this count as a bug? -- Hal Daume

[Haskell] for large x, log (x::Integer) :: Double

2004-06-30 Thread Hal Daume III
-- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

[Haskell] randomgen for foreign random functions

2004-06-25 Thread Hal Daume III
? - Hal -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: [Haskell] randomgen for foreign random functions

2004-06-25 Thread Hal Daume III
presume that you would need addtional code for multi-threaded use.] I don't care about multi-threaded use. - Hal -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume

Re: [Haskell] return?

2004-04-30 Thread Hal Daume III
-- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: [Haskell] insufficiently [EMAIL PROTECTED] -- more counterintuitive stuff

2004-03-30 Thread Hal Daume III
___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume

Re: [Haskell] main::[String]-IO() ?

2004-03-22 Thread Hal Daume III
is running in the IO monad either way)? Ciao, Steffen ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he

Re: Polymorphic lists...

2004-03-09 Thread Hal Daume III
a . a - i - i Regards, Keean Schupke. ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-users -- Hal Daume III | [EMAIL PROTECTED] Arrest

Re: [Haskell] regular expression syntax - perl ain't got nothin on haskell

2004-02-24 Thread Hal Daume III
Larsson wrote: .. I have since long missed some typical text processing functionality in haskell. it is often the case that people process text only because they have no better (structured and typed) way of representing their data... -- Hal Daume III

Re: [Haskell] performance tuning Data.FiniteMap

2004-02-24 Thread Hal Daume III
___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell -- Hal Daume III | [EMAIL

RE: optimization question

2004-02-23 Thread Hal Daume III
/mailman/listinfo/glasgow-haskell-users ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-users -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he

Re: data label overloading

2004-01-13 Thread Hal Daume III
:: Int } f x y z = let size = foo1_size in (size x) + (size y) + (Foo2..size z) also, this would lead to highly ambiguous parses, i think. - hal -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths

Re: getting the path to the executing program

2004-01-09 Thread Hal Daume III
Hi, If I may suggest, a Haskell implementation may want to give a programmer a way to obtain the unmangled argv0. If I may second that, ... -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume

POpen, opening lots of processes

2004-01-08 Thread Hal Daume III
which basically seems to be telling me that the program hasn't been closing the old processes, even though they're definitely not in use anymore. Does anyone have any suggestions how to get around this? Thanks! - Hal -- Hal Daume III | [EMAIL PROTECTED

getting the path to the executing program

2004-01-08 Thread Hal Daume III
Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: getting the path to the executing program

2004-01-08 Thread Hal Daume III
Jan 2004, Christopher Milton wrote: The environmental var _ in $ENV{_} (pardon my Perlish) holds the full path name of the command currently executing (itself), at least on RedHat Linux and HP-UX, so you should be able to use getEnv... I think... --- Hal Daume III [EMAIL PROTECTED] wrote

Re: getting the path to the executing program

2004-01-08 Thread Hal Daume III
True. Replace the with a and ? with , if it exists?. On Thu, 8 Jan 2004, Lennart Augustsson wrote: Hal Daume III wrote: is there a function, related to getProgName, which returns the (absolute) path to the current program? Well, the absolute path name is not necessarily unique, nor

Re: safe array freezing?

2003-12-31 Thread Hal Daume III
with) to the standard libraries, as it would be nice to be able to use this idiom without resorting to trickery. (well, user visible trickery at least) John -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu

Re: How to make reading an array from disk more efficient

2003-12-24 Thread Hal Daume III
to filter the pixel strean so that a subsection of the image is selected. All that is possible in the code I have now, but it's slow. Thanks, Andrew -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume

Re: How to make reading an array from disk more efficient

2003-12-24 Thread Hal Daume III
for each message (I'm pretty sure it used to be made daily, which was a nuisance if you wanted to forward URLs to interesting discussions). Hal Daume III said: (1) use unboxed arrays, otherwise you're wasting too much space with pointers. that is, unless you need laziness on the elements

Re: let-where difference

2003-12-22 Thread Hal Daume III
PROTECTED] ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume

Re: type of (/) ?

2003-12-09 Thread Hal Daume III
= 5 my_avg list = (accum list) / xx --doesn't work -- same message as above This doesn't work because defaulting occurs and xx is given type Integer. -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume

RE: internal error: evacuate: strange closure type 33544

2003-12-08 Thread Hal Daume III
: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED] On Behalf Of Hal Daume III Sent: 05 December 2003 17:40 To: [EMAIL PROTECTED] Subject: Re: internal error: evacuate: strange closure type 33544 I recompiled after a minor change (which is in code that hasn't been reached at the point

internal error: evacuate: strange closure type 33544

2003-12-05 Thread Hal Daume III
was running for a *long* time before it cropped up. if you want, i can send you the source/data files it was running on, but i don't know that you'd be able to glean much information from that... - hal -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he

Re: internal error: evacuate: strange closure type 33544

2003-12-05 Thread Hal Daume III
closure type 1001 @ 0x406640d0 Please report this as a bug to [EMAIL PROTECTED], or http://www.sourceforge.net/projects/ghc/ On Fri, 5 Dec 2003, Hal Daume III wrote: Hi guys, I have no idea what this is: 8:45am dixiechicks:DUC04/ ../SVMseq/SVMseqLearn -m 1800 --string-maxn=3 -h

Re: Why are strings linked lists?

2003-11-28 Thread Hal Daume III
and concatenating them (AFAIK). Either way, you're going to get performance hits for going through [Char]s. As a minor quibble, I don't like the naming scheme with packString and unpackPS...seems very unbalanced to me :). my 2 cents - Hal -- Hal Daume III

Re: Why are strings linked lists?

2003-11-28 Thread Hal Daume III
fit. -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

specializing on existentially quantified data types

2003-11-24 Thread Hal Daume III
Hi all, Suppose you have: class C a where ... data MkC = forall a . C a = MkC a foo :: MkC - ... and I want to specialize foo for when the 'a' in the MkC is, say, Int. Is this possible? -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks

Re: Resolving Ambiguous Types

2003-11-20 Thread Hal Daume III
___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume

Re: record matching syntax forensics

2003-11-13 Thread Hal Daume III
. John -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Programming style (or: too clever by half?)

2003-11-12 Thread Hal Daume III
___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume

set representation question

2003-11-11 Thread Hal Daume III
structure that could do this more quickly (i.e., in logarithmic time). is such a thing possible? does anyone have a haskell implementation of such a thing? :P thanks! - hal -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths

Re: Number conversions, like floats to doubles

2003-11-08 Thread Hal Daume III
-- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: access to fields in nested records

2003-11-05 Thread Hal Daume III
] to the reply list. -- Serge Mechhveliani [EMAIL PROTECTED] ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell -- Hal Daume III | [EMAIL PROTECTED

RE: access to fields in nested records

2003-11-05 Thread Hal Daume III
)} ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume

Re: Trying to understand tuples and lists

2003-11-05 Thread Hal Daume III
PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell-Cafe mailing list [EMAIL PROTECTED

Re: Another Newbie question :)

2003-11-05 Thread Hal Daume III
Keith is entirely correct. You can see this from the definition of foldr: foldr :: (a - b - b) - b - [a] - b foldr f z [] = z foldr f z (x:xs) = f x (foldr f z xs) where clearly every [] is replaced by z and every : by f. I had heard this before when I was first beginning and didn't

Re: Boilerplate revisited

2003-11-04 Thread Hal Daume III
] http://www.haskell.org/mailman/listinfo/haskell -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell mailing list [EMAIL PROTECTED] http

Re: Data types basics

2003-11-04 Thread Hal Daume III
or of the form Baz x for some x which is of type a. This has constructors: Bar :: Foo a Baz :: a - Foo a I hope this sheds some light on the issue... -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume

Re: Help ? :)

2003-11-03 Thread Hal Daume III
Int Int here, the type is called PairOfInts and the constructor is called PairOfInts; the constructor takes two ints as arguments. HTH, - Hal -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume On Mon, 3

Re: Doubt regarding Types

2003-11-03 Thread Hal Daume III
) has type Bool, but it's expecting it to have type IO something. You need to lift the pure Bool value into IO by saying return: getBoardSize = do c - getLine return (validateBoardSize (read c)) -- Hal Daume III | [EMAIL PROTECTED] Arrest this man

Re: Haskell Asignement not working

2003-10-29 Thread Hal Daume III
. |n0 = `sideBySide` sb (bLine (n-1)) The `foo` notation is used to make a function (in your case sideBySide) into an infix function, so you can write x `foo` y. but in your case you're not using it infix, so you don't want the ``s. HTH, - Hal -- Hal Daume III

Re: Transmitting Haskell values

2003-10-28 Thread Hal Daume III
the split between type/class index and function/constructor index in the Haddockish doc-index.html file. For newbies like me, the I agree :); or perhaps have the split as well as a big index without the split. - Hal -- Hal Daume III | [EMAIL PROTECTED

Re: Marshalling functions was: Transmitting Haskell values

2003-10-28 Thread Hal Daume III
No, it's possible -- it's done under the hood in GPH (parallel Haskell); it just doesn't exist in normal GHC... On Tue, 28 Oct 2003, Dimitry Golubovsky wrote: Hi, Hal Daume III wrote: Hmm... I can write out functions using the Show (a - b) instance, but there's no matching Read (a - b

Re: Transmitting Haskell values

2003-10-26 Thread Hal Daume III
PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-users -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Glasgow-haskell-users mailing list

Re: UArray question....

2003-10-26 Thread Hal Daume III
/ ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-users -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths

[Caml-list] IBM funding for OCaml on Eclipse? (fwd)

2003-10-26 Thread Hal Daume III
Perhaps someone one this list might find this interesting... -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume -- Forwarded message -- Date: Sat, 25 Oct 2003 22:18:59 -0700 From: Greg K

Re: random numbers

2003-10-24 Thread Hal Daume III
to this function must always return the same result). Secondly, but perhaps more importantly, is there a more 'beginnerish' list that I should be addressing this to? I've been following discussions on this one and they don't seem to be at quite this level. This list is appropriate. -- Hal Daume III

SPECIALIZEing something from another module

2003-10-23 Thread Hal Daume III
Is this possible, or need the specializations go in the defining module. Is this decision based on a fundamental problem with allowing specializations anywhere, or was it just a design choice (in which case I would encourage it's removal)... Thanks! - Hal -- Hal Daume III

Re: Enum on Float/Double

2003-10-22 Thread Hal Daume III
not. :) -- Lennart Hal Daume III wrote: My preference would be for succ (+-0) to return the smallest positive real, since then you could define succ x to be the unique y with x y and forall z . z y = not (x z), where such a y exists, and I'm not sure if the Haskell standard knows about signed

Re: Enum on Float/Double

2003-10-21 Thread Hal Daume III
My preference would be for succ (+-0) to return the smallest positive real, since then you could define succ x to be the unique y with x y and forall z . z y = not (x z), where such a y exists, and I'm not sure if the Haskell standard knows about signed zeros. Is this really useful?

Re: how to do lazy IO like getContents?

2003-10-18 Thread Hal Daume III
a 'head:: empty list' error, while if 'f' is 'evaluate . head', you won't. -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume On Sat, 18 Oct 2003, Ben Escoto wrote: On Sun, 19 Oct 2003 02:03:58 +0200 Nick

Re: how to do lazy IO like getContents?

2003-10-18 Thread Hal Daume III
I don't understand the details of your example (for instance, what does evaluate do? I found a reference to it in the GHC manual under Debug.QuickCheck, but couldn't figure out what it.), but get the general point. evaluate is from Control.Exception; basically it's: evaluate :: a - IO a

Re: parsing a file line by line

2003-10-16 Thread Hal Daume III
( Contents contains all the text in the file, which is given as input) Thanks Anagha -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell-Cafe mailing

Re: putStr

2003-10-14 Thread Hal Daume III
In addition to what Keith said, it's also guarenteed that the trace is evaluated as soon as the function is entered. - Hal On Tue, 2003-10-14 at 02:36, Ferenc Wagner wrote: Hal Daume III [EMAIL PROTECTED] writes: f1 :: Int - Int f1 x | trace (The initial value is ++ show x) False

Re: putStr

2003-10-13 Thread Hal Daume III
this? Thank you ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths

Re: lexer puzzle

2003-09-25 Thread Hal Daume III
Hi, But I'm just writing this to let you guys know (surely you know this already) that anyone from a C/C++/Java/Delphi background is going to completely misunderstand the meaning of A.anything in Haskell... it's completely nonintuitive to people with my background. Surely this is no worse

Re: From enumerators to cursors: turning the left fold inside out

2003-09-24 Thread Hal Daume III
-- the initial seed - IO seed type FileName = String type Title = String -- just an identifying string for debug printing type Iteratee seed = seed - Char - Either seed seed -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks

Re: File reading question

2003-09-12 Thread Hal Daume III
PROTECTED] (571)330-9012 The box said Requires Windows 95 or better. So I installed LINUX ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell -- Hal Daume III | [EMAIL

Re: Syntax extensions (was: RE: The Future of Haskell discussion at the Haskell Workshop)

2003-09-10 Thread Hal Daume III
PROTECTED] http://www.haskell.org/mailman/listinfo/haskell -- -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell mailing list [EMAIL PROTECTED] http

Re: GHC code generation

2003-09-10 Thread Hal Daume III
. #g Graham Klyne [EMAIL PROTECTED] ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell -- -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he

Haskell for non-Haskell's sake

2003-08-30 Thread Hal Daume III
for Haskell - writing Haskell debuggers, tracers, profilers or other tools - more or less anything with matches /.*Haskell.*/, other than /in Haskell$/ :) Thanks, - Hal -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths

Announce: HWordNet - A Haskell Interface to WordNet

2003-08-19 Thread Hal Daume III
implicit parameters, so you've got to have GHC or Hugs or some other compiler that supports those. - Hal -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume

Ann: HAllInOne bug fix release

2003-07-30 Thread Hal Daume III
Hi Fellow Haskellers, I normally wouldn't send out bug fix notifications, but there has been an update to HAllInOne (http://www.isi.edu/~hdaume/HAllInOne/), which fixes two major bugs: - recursive modules now work correctly - proper separation of type and value environments The reason I'm

Re: Announce: Haskell All-In-One

2003-07-17 Thread Hal Daume III
test cases, but if someone wants to stress test this and submit bugs, that would be great. A new version is up on the web page now. - Hal -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume On Sun, 13

Announce: Haskell All-In-One

2003-07-13 Thread Hal Daume III
imports 'bracket' and uncomment the 'cast' function in the GMap library. - Hal -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Haskell mailing list [EMAIL

Re: Ledit (was Re: [Caml-list] how to use a module) (fwd)

2003-07-01 Thread Hal Daume III
There was some discussion about something like this a while ago...would this solve our problems? -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume -- Forwarded message -- Date: Tue, 1 Jul

Re: Type classes and code generation

2003-06-17 Thread Hal Daume III
(Moved to the Cafe) Yes, exactly. Every class is translated to a data type declaration, and every instance is translated to an element of that data type - a dictionary. (Note that you can't actually write those declarations in Haskell 98 in general, because they can have polymorphic

Re: Threads

2003-06-13 Thread Hal Daume III
Presumably you need a call to yield or threadDelay or something like that. -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume On Fri, 13 Jun 2003, Filip wrote: Hi, I have function f:: a - b and I

Re: main modules in GHC, deriving differences between GHC and Hugs

2003-06-13 Thread Hal Daume III
with a 'main :: IO a' function as an executable without having to call it Main. You can probably find a message from me to this extent in the archives, as well as some response. - Hal -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths

Re: problems with working with Handles

2003-06-12 Thread Hal Daume III
to be the text in the output file. I'm guessing this has something to do with buffering. When you open the files, try 'hSetBuffering h? NoBuffering' and see if that fixes it. -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths

bug with definition at top-level:

2003-06-11 Thread Hal Daume III
it as a compiler bug to [EMAIL PROTECTED], or http://sourceforge.net/projects/ghc/. -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Glasgow-haskell-bugs mailing list

Re: LOOPS

2003-06-11 Thread Hal Daume III
is 'true' at the start, it will never be 'false'). Moreover, there isn't usually a return value associated with a while statement. -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume On Wed, 11 Jun 2003, Filip wrote

Re: Stupid wuestion about Monads :)

2003-06-11 Thread Hal Daume III
Look through the mailing list archives/wiki/haskell tutorials. But basically you can't, except by combining it with another action, as in: suppose 'baz :: Int - IO Bool', then: foo = do bar - baz 5 if bar then ... else ... for instance... -- Hal Daume III

RE: GHC 6.0 Release: sparc-solaris2 binaries

2003-06-04 Thread Hal Daume III
not have the path problems the previous one(s) did. -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume On Tue, 3 Jun 2003, Simon Marlow wrote: Sorry about that. It's fixed at: http://www.isi.edu

Re: GHC 6.0 Release: sparc-solaris2 binaries

2003-06-04 Thread Hal Daume III
I don't think this is the problem, though, as none of the path issues he mentioned contained the ill-mannered hdaume in them :). Perhaps SimonM can comment more on this... -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths

Re: labelled fields

2003-06-04 Thread Hal Daume III
track of something with a combination of multiple named fields and multiple unnamed fields. I don't know though... You can always give them names like _foo1 etc., in which case ghc probably won't warn about them, as is the case with methods whose names begin with underscores... - Hal -- Hal Daume

RE: GHC 6.0 Release: sparc-solaris2 binaries

2003-06-03 Thread Hal Daume III
Sorry about that. It's fixed at: http://www.isi.edu/~hdaume/ghc-6.0-sparc-solaris2.tar.bz2 Simon: could you update the haskell.org link? - Hal -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume On Mon

Re: a readFile problem

2003-06-03 Thread Hal Daume III
It would probably be helpful if you were to post the code you have and explain what part isn't working. There's a function: readFile :: FilePath - IO String (FilePath is just a String) which reads a file. This should be what you need to solve this exercise... - Hal -- Hal Daume III

RE: GHC 6.0 Release: sparc-solaris2 binaries

2003-05-31 Thread Hal Daume III
Yes, it does. Furthermore, this contains profiling and normal libraries, but not documentation. - Hal -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume On Fri, 30 May 2003, Simon Marlow wrote

GHC 6.0 Release: sparc-solaris2 binaries

2003-05-30 Thread Hal Daume III
:). Happy Haskelling! - Hal -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman

Re: Implementing RefMonads in Haskell without ST,IO

2003-05-30 Thread Hal Daume III
But how can one implement RefMonad to support references of all possible types simultaneously? ...you could use Dynamics... but other than that, I think you're stuck... - Original Message - From: Derek Elkins [EMAIL PROTECTED] To: Tim Sweeney [EMAIL PROTECTED] Cc: [EMAIL

Re: Performance Timing

2003-03-27 Thread Hal Daume III
current time return (different in t2 and t1) where evaluate is from Control.Exception. could someone tell me how evaluate compares to seq and deepSeq? -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume

Re: Polishing the boilerplate: a dis-unsafely safe cast

2003-03-24 Thread Hal Daume III
unsafeCoerce. Using simply String ids as in the referenced paper would make this sort-of-safe, provided users don't give bogus instances of Typeable. -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume On Mon, 24 Mar

RE: simulating dynamic dispatch

2003-03-21 Thread Hal Daume III
this odd... -- Hal Daume III | [EMAIL PROTECTED] Arrest this man, he talks in maths. | www.isi.edu/~hdaume On Fri, 21 Mar 2003, Simon Peyton-Jones wrote: You might also find the 'cast' function in Section 3 of Scrap your boilerplate useful. http

  1   2   3   4   5   >