Re: GHC for MacOS X binary - ranlib and libgmp

2002-03-27 Thread Ashley Yakeley
, which uses createAdjustor. I'll let you know how it works out... -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

Re: GHC for MacOS X binary now available

2002-03-27 Thread Ashley Yakeley
to want it. My workaround is to pass these to GHC: -pgmc cc -pgma cc -pgml cc (actually I use $(CC) instead of cc in my Makefile). Consider using 'cc' instead of 'gcc' for default programs. -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users

Re: Gaussian Integers

2002-03-19 Thread Ashley Yakeley
a = Num (Gaussian a) where ... ...and actually looking at your code, I think you want this: instance Num a = Num (Gaussian a) where ... -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org

Re: IO and syntax

2002-03-12 Thread Ashley Yakeley
monads and the 'do' notation -- confusing 'a' with 'IO a'. When in doubt, add type signatures to everything. You'll soon narrow it down. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman

Re: Hiring Haskell programmers

2002-03-11 Thread Ashley Yakeley
or some other FP language, learning Haskell should not be hard. Otherwise I really don't think you can learn Haskell all that quickly. Mind you, I don't think there are all that many ML programmers out there either. -- Ashley Yakeley, Seattle WA

MonadCont, MonadFix

2002-03-09 Thread Ashley Yakeley
Are there any useful monads that are instances of both MonadCont and MonadFix? I can't make the two meet. Perhaps this is because continuations have no fixed point, or something. Very annoying. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing

Re: first-class polymorphism beats rank-2 polymorphism

2002-03-06 Thread Ashley Yakeley
this: combinator :: (forall y. Class y = y - y) - (forall x. Class x = x - x) combinator f x = combinator' f x but for some reason GHC 5.02.2 complains. I think this is a bug. Apparently 5.03 has rank-N polymorphism so maybe this is fixed too. -- Ashley Yakeley, Seattle WA

Re: how to read a file's content to a string?

2002-03-05 Thread Ashley Yakeley
At 2002-03-05 14:43, Zhe Fu wrote: content :: FilePath - String content f = readFile f You have the wrong type signature for 'content'. This should solve it: content :: FilePath - IO String content f = readFile f Of course, you'll need to change whatever uses 'content'. -- Ashley

Re: Double your money in 30 days

2002-03-03 Thread Ashley Yakeley
-- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

Re: GHC on MacOS X

2002-03-02 Thread Ashley Yakeley
At 2002-03-02 14:21, Wolfgang Thaller wrote: The results: another unregistered build, a PowerPC implementation of createAdjustor (foreign export dynamic now works!). Excellent! I will be porting JVM-Bridge to it as soon as it's ready. -- Ashley Yakeley, Seattle WA

Re: FW: Haskell 98 lexical syntax again

2002-02-28 Thread Ashley Yakeley
-Update1/PropList-3.1.1.html -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Monadic Call/CC?

2002-02-23 Thread Ashley Yakeley
? Is this documented somewhere? -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: Monadic Call/CC?

2002-02-22 Thread Ashley Yakeley
work too well; huh? I havent't tested it. But I agree that it certainly won't allow continuations to survive after peirceM has returned, so can't be considered proper call/cc. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL

Re: Monadic Call/CC?

2002-02-22 Thread Ashley Yakeley
, this won't eat up space. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: Monadic Call/CC?

2002-02-21 Thread Ashley Yakeley
. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: Monadic Call/CC?

2002-02-21 Thread Ashley Yakeley
(\a _ - (cont a)) cont; -- constructors removed -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: Monadic Call/CC?

2002-02-21 Thread Ashley Yakeley
At 2002-02-21 19:36, I wrote: And then your 'main' function has type 'Action'. Sorry, And then your 'main' function has type 'Action - Action'. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org

Monadic Call/CC?

2002-02-20 Thread Ashley Yakeley
function: peirce :: ((a - b) - a) - a; probably can't be defined. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

RE: Strictness information?

2002-02-19 Thread Ashley Yakeley
if they are autogenerated... -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

RE: foralls in class assertions

2002-02-19 Thread Ashley Yakeley
an instance HasIdentity (m a a), and also for all types a b c, there's an instance Composable (m b c) (m a b) (m a c)'. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: a universal printer for Haskell?

2002-02-19 Thread Ashley Yakeley
via private email, but when I emailed you in the past I didn't get a reply.) That sounds like me... -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: a universal printer for Haskell?

2002-02-19 Thread Ashley Yakeley
system that has a tiny bit of introspective powers can be said to be reflective to some extent, for instance a Haskell interpreter. That's fine, but I don't include a Haskell interpreter in my compiled Haskell programs. And I don't want other people peeking inside my types at run-time. -- Ashley

Re: a universal printer for Haskell?

2002-02-19 Thread Ashley Yakeley
://www.haskell.org/ghc/docs/latest/set/generic-classes.html I suspect you can use them to do what you want... -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: a universal printer for Haskell?

2002-02-18 Thread Ashley Yakeley
Generics are just as bad, but I'm hoping they won't catch on. Speaking of which, can you not do this sort of thing with Generics anyway? -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Scheme in Haskell?

2002-02-18 Thread Ashley Yakeley
Has anyone attempted any kind of Scheme interpreter in Haskell? -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Scheme in Haskell?

2002-02-18 Thread Ashley Yakeley
as a general user scripting language for such things as transforming XML documents, etc., as part of my project (Truth) to provide a user interface to all information [insert maniacal Bond villain laugh here]. A bit like Guile, I suppose. -- Ashley Yakeley, Seattle WA

Re: Composition Monad

2002-02-17 Thread Ashley Yakeley
-- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

foralls in class assertions

2002-02-16 Thread Ashley Yakeley
context: foo :: (forall a. (C a b) = D a c) = T b c; Does this make sense? Would it have unpleasant consequences? -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Specifying Kinds of Types

2002-02-08 Thread Ashley Yakeley
::: * - *) = MkCMap0; ...or perhaps data ({* - *} p,{* - *} q) = CMap0 p q = MkCMap0; ...or whatever. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Kinds Workaround

2002-02-08 Thread Ashley Yakeley
; }; data (T (p Bool),T (q Bool)) = CMap0 p q = MkCMap0; type Composer c = forall x y z. (T (x Bool)) = (c y z) - (c x y) - (c x z); Neat, huh? Finally, a reason for allowing contexts in data type declarations! -- Ashley Yakeley, Seattle WA

Re: Reference types

2002-02-07 Thread Ashley Yakeley
a - (a - a) - m (); modify ref map = (get ref) = ((set ref) . map); -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Reference types

2002-02-07 Thread Ashley Yakeley
monads. I'm quite happy to have references depend on a state identifier myself. For instance...? -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

RE: Reference types

2002-02-07 Thread Ashley Yakeley
Haskell do the clever generalisation stuff. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

RE: Reference types

2002-02-07 Thread Ashley Yakeley
porting code between monads to be as easy as possible. The way forward for this is classes and types in the standard libraries that generalise over any monad which has the necessary properties. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL

Re: Reference types

2002-02-06 Thread Ashley Yakeley
the programmer have two different kinds of reference for the same monad, and 'readRef' and 'writeRef' will work on any Ref. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Reference types

2002-02-06 Thread Ashley Yakeley
equally well as 'Ref (ST s) a' as they will as 'Ref TransformedMonad a'. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Reference types

2002-02-06 Thread Ashley Yakeley
m) = Ref m Int ...i.e., references that work with multiple monads. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Reference types

2002-02-06 Thread Ashley Yakeley
or a tremendously early riser! Um, yeah, that's a side effect of unemployment, along with haemorrhaging open-source software (see Truth). Does anyone need a Haskell developer in the greater Seattle area? -- Ashley Yakeley, Seattle WA ___ Haskell mailing

Binary Compatibility

2002-02-05 Thread Ashley Yakeley
Apologies if this has been covered before. What compatibility is there between code compiled in different versions of GHC? My JVM-Bridge was compiled under 5.02 and assembled as package 'javavm'. Will that package work if added to GHC 5.02.2? What about 5.03? -- Ashley Yakeley, Seattle WA

Re: ANNOUNCE: GHC 5.03.20020204 snapshot release

2002-02-05 Thread Ashley Yakeley
which parameter the newtype is being derived on? - Linear implicit parameters: a highly experimental feature. What are they? -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman

Re: Reference types

2002-02-05 Thread Ashley Yakeley
of members of the form a - b, where the a's are all the same, it's a clue to consider using a data type instead. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Reference types

2002-02-05 Thread Ashley Yakeley
- newIORef a; return MkRef (readIORef r) (writeIORef r) (modifyIORef r) }; }; instance RefMonad (ST s) where etc. The point is that the m - r dependency is also unnecessary, except when you want a new standard ref for a monad. -- Ashley Yakeley

Re: RFC: Syntax for implicit parameter bindings

2002-02-04 Thread Ashley Yakeley
At 2002-02-04 01:45, Koen Claessen wrote: | addBase{?base=7} 5 I like this! It is the least polluting syntax of all. Hmm... you have braces without following a keyword. I think in all other cases, braces follow a keyword (where, let, do, of). -- Ashley Yakeley, Seattle WA

Re: RFC: Syntax for implicit parameter bindings

2002-02-03 Thread Ashley Yakeley
story to work as recursive bindings, but I don't know any details here. Even if this happens, we can still hold onto := for explicit value bindings, if that's a useful feature. -- Ashley Yakeley, Seattle WA Never trust whitespace. ___ Haskell mailing

Implicit Parameter Bug?

2002-02-03 Thread Ashley Yakeley
checking ...and spins there. There's a workaround for ghci, but it doesn't help hugs: h :: a - a h = f (g with ?param = ?param) This is very odd, as surely the type of (g with ?param = ?param) is the same as the type of g? -- Ashley Yakeley, Seattle WA

Another Implicit Parameter Infelicity

2002-02-03 Thread Ashley Yakeley
- a q b = g (which works fine with both). However, this _does_ work, but only in ghci: f :: ((?param :: a) = b) - a - b f foo a = foo with ?param=a Hugs just spins trying to do 'Type checking'. -- Ashley Yakeley, Seattle WA ___ Haskell

Re: using composition with multiple argument functions

2002-02-01 Thread Ashley Yakeley
At 2002-02-01 10:45, Dean Herington wrote: h1 :: (a - a - (a,a)) - (a - a - (a,a)) - (a - a - (a,a)) h1 = f1 # g1 I think you mean: h1 :: (a - a - (a,a)) - (a - a - (a,a)) - (a - a - (a,a)) h1 f g = f # g -- Ashley Yakeley, Seattle WA

Re: type specs not making it in to functions

2002-01-25 Thread Ashley Yakeley
from putting in an inappropriate back channel in the member for some instance of the class. 3. It avoids use of 'undefined', which is just plain ugly. After all, intuitively everything is defined. -- Ashley Yakeley, Seattle WA Almost empty page: http://semantic.org

Re: notes on ghc-5.02.2. Reply

2002-01-24 Thread Ashley Yakeley
At 2002-01-24 06:52, Ketil Z. Malde wrote: GHC is in Debian, you probably want to use a cutting-edge release (i.e. sid or at least woody) to be reasonably current. ghc5 in woody and sid is 5.02. If anyone would has a deb for the latest release, that would be very useful... -- Ashley Yakeley

Re: Translation of SML into Haskell

2002-01-23 Thread Ashley Yakeley
/001258.html Haskell http://haskell.org/pipermail/haskell-cafe/2002-January/001261.html I'd be interested if this really is always possible, or whether someone has an ML structures/functors example that can't be straightforwardly converted into Haskell. -- Ashley Yakeley, Seattle WA

Re: Ambiguous types

2002-01-21 Thread Ashley Yakeley
of `isempty': null emptyList Hugs says: ERROR ActorTest.hs (line 7): Cannot justify constraints in explicitly typed binding *** Expression: isempty *** Type : Bool *** Given context : () *** Constraints : Ord a -- Ashley Yakeley, Seattle WA

Re: question about kinds

2002-01-18 Thread Ashley Yakeley
, or a List of Lists is traversable. If the Tree type constructor is Traversable, then it's Traversable no matter what it's applied to. You've provided a instance for traversing Trees of anything, it's going to overlap with any instance for Trees of Lists. -- Ashley Yakeley, Seattle WA

Re: dependent type query

2002-01-18 Thread Ashley Yakeley
mkMyData2 :: (MyClass f a) = f - MyData2 f mkMyData2 = MyData2 Looks like extended Haskell is being excessively restricted. Comments? -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo

Re: question about kinds

2002-01-18 Thread Ashley Yakeley
, or a List of Lists is traversable. If the Tree type constructor is Traversable, then it's Traversable no matter what it's applied to. You've provided a instance for traversing Trees of anything, it's going to overlap with any instance for Trees of Lists. -- Ashley Yakeley, Seattle WA

Re: question about kinds

2002-01-18 Thread Ashley Yakeley
= ... -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: functions not in type classes

2002-01-18 Thread Ashley Yakeley
the correct generalisation is often not obvious... -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: functions not in type classes

2002-01-18 Thread Ashley Yakeley
values (functions) and not others. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: functions not in type classes

2002-01-18 Thread Ashley Yakeley
classes have the benefit of using multi dispatch based on two non related types. Or two related types, if you prefer. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: functions not in type classes

2002-01-18 Thread Ashley Yakeley
- Integer - IO [Word8] fileWrite :: FileHandle2 - [Word8] - IO () instance Stream2 FileHandle2 Word8 where read = fileRead write = fileWrite -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org

Re: Regarding finding the number of unique elements in a list.

2002-01-17 Thread Ashley Yakeley
in the innermost list in a list within lists. Well, this you'll have to do yourself. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: Yell

2002-01-12 Thread Ashley Yakeley
At 2002-01-12 10:22, Hal Daume III wrote: This seconds the yell. In the mean time Hugs has some documentation: http://www.cse.ogi.edu/PacSoft/projects/Hugs/pages/hugsman/exts.html#sect7. 4 -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users

Re: State Transformer

2002-01-11 Thread Ashley Yakeley
?ref writeSTRef ?ref (c,n+2) tryTestFunc = runST testfunc -- Curiously, GHC isn't smart enough to infer the types of foo and bar by itself. -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http

Yell

2002-01-11 Thread Ashley Yakeley
This message constitutes a yell. http://www.haskell.org/ghc/docs/latest/set/implicit-parameters.html Thanks in advance... -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman

Library Report Omission

2002-01-05 Thread Ashley Yakeley
... -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

RE: Compiler error using IO

2002-01-04 Thread Ashley Yakeley
; if res then do { action; while test action; } else return (); }; -- ...and then you can put the whitespace wherever you want. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL

ANN: Release 0.1 of Haskell/Java VM Bridge

2001-12-16 Thread Ashley Yakeley
as soon as there's a port of GHC 5.02 with a working createAdjustor. -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

Re: ANNOUNCE: GCJNI - Java Native Interface for Haskell

2001-12-16 Thread Ashley Yakeley
no idea anyone else was working on this. Nevertheless, I suspect I'm further along. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

ANN: Release 0.1 of Haskell/Java VM Bridge

2001-12-16 Thread Ashley Yakeley
as soon as there's a port of GHC 5.02 with a working createAdjustor. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: (no subject)

2001-12-10 Thread Ashley Yakeley
this in polynomial time. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: class parameters to existential datatypes

2001-12-06 Thread Ashley Yakeley
At 2001-12-06 13:04, John Hughes wrote: data Foo c = forall a . c a = Foo a What are you trying to say? In 'data Foo c' you are saying that c is a type (as a parameter). In 'c a =' you are saying that c is a class. So naturally Haskell complains. -- Ashley Yakeley, Seattle WA

Re: class parameters to existential datatypes

2001-12-06 Thread Ashley Yakeley
At 2001-12-06 13:11, Ashley Yakeley wrote: At 2001-12-06 13:04, John Hughes wrote: data Foo c = forall a . c a = Foo a What are you trying to say? In 'data Foo c' you are saying that c is a type (as a parameter). In 'c a =' you are saying that c is a class. So naturally Haskell

Re: GHC 5.02.1 on Mac OS X

2001-12-02 Thread Ashley Yakeley
). -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

Re: Global variables

2001-11-29 Thread Ashley Yakeley
: http://cvs.sourceforge.net/cgi-bin/viewcvs.cgi/~checkout~/jvm-bridge/sourc e/Haskell/IOLiftedMonad.hs?rev=HEADcontent-type=text/plain -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo

Re: Global variables

2001-11-29 Thread Ashley Yakeley
At 2001-11-29 11:13, Ashley Yakeley wrote: Lifted monads look something like this: data MyAction a = MkMyAction ((consts,vars) - (vars,a)); instance Monad MyAction where etc. Whoops, should be data MyAction a = MkMyAction ((consts,vars) - IO (vars,a)); -- Ashley Yakeley

Re: Having contraints like 'Fractional Int = IO ()'

2001-11-13 Thread Ashley Yakeley
() It sounds like you're trying to use your 'mean' function on Ints. Int is not a Fractional type (unless you make it one), and so '/' isn't defined on it. What's mean [3::Int,4::Int]? It can't be 3.5::Int because 3.5 is not an integer and so not an Int. -- Ashley Yakeley, Seattle WA

Re: URGENT: File exists

2001-11-03 Thread Ashley Yakeley
Bool ... -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Transmitting parameters

2001-11-02 Thread Ashley Yakeley
At 2001-11-01 22:10, raul sierra alcocer wrote: What mechanism of transmiting parameters does Haskell implement? By value. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

'Forall' Polymorphism Question

2001-10-31 Thread Ashley Yakeley
a) ...? Is this something GHC could ever do, or are there good reasons why it would never work in Haskell? -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: varying number of arguments restriction

2001-10-30 Thread Ashley Yakeley
At 2001-10-30 11:01, Hal Daume wrote: obviously i can rewrite: foo [] = foo s = (snd . head) s but this is uglier. I'm not sure. I actually prefer it written out so that the number of arguments in the cases matches (as GHC enforces). -- Ashley Yakeley, Seattle WA

Re: GHC modules and packages

2001-10-28 Thread Ashley Yakeley
Quite apart from the documentation, the Haskell library situation in general seems to be widely acknowledged as a bit of a shambles, and a serious improvement effort is ongoing. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED

RE: rank 2-polymorphism and type checking

2001-10-28 Thread Ashley Yakeley
? But GHC doesn't allow it... -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

GHC Installation Location

2001-10-25 Thread Ashley Yakeley
Is there an easy way to get 'ghc' or one of the other binaries to tell me where the GHC installation directory is? I want to put the includes directory in a gcc -I flag in my makefile. -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users

RE: GHC Installation Location

2001-10-25 Thread Ashley Yakeley
{ #include Rts.h } ...which I've recently entered a bug in SourceForge about. -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

RE: GHC Installation Location

2001-10-25 Thread Ashley Yakeley
At 2001-10-25 03:18, Ashley Yakeley wrote: I've wondered at various times in the past whether there ought to be a link from /usr/local/includes/ghc to /usr/local/lib/ghc-5.02/includes. Won't help, my GHC is installed at /usr/lib/ghc-5.02/, exactly where the Debian package put it. Actually I

Haskell 2: Enum Classes

2001-10-24 Thread Ashley Yakeley
one' functions, those go with numeric classes, which many Enum types would not be instances of. For instance, the letter 'q' is the successor of the letter 'p', but that does not mean that 'q' = 'p' + 1 is meaningful. -- Ashley Yakeley, Seattle WA

Re: Multi-parameter OOP

2001-10-19 Thread Ashley Yakeley
data DerivedType = D1 | D2 data BaseType |= BD DerivedType -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

createAdjustor on Darwin

2001-10-18 Thread Ashley Yakeley
dynamic exporting of callback functions through the FFI... -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

Re: performUnsafeIO

2001-10-11 Thread Ashley Yakeley
At 2001-10-11 11:55, Sebastian Schulz wrote: I need to extract an IO String to String. No!!! Don't do it. Make the final result of your Haskell calculation be an IO String. Then when you have a look at it, it will be automatically executed and you'll see the String. -- Ashley Yakeley

Re: Ptr and ForeignPtr Questions

2001-10-10 Thread Ashley Yakeley
import foo foo :: Ptr SomeLinkedList - IO (Ptr Char); and it should work. The only thing that's missing is a ConstPtr type... -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman

Re: Monomorphism, monomorphism...

2001-10-10 Thread Ashley Yakeley
set of types for A. I'm convinced extensible datatypes are the cleanest and most in-spirit extenstion to Haskell to solve this. data T = _; ... data T |= MkAT A; upA = MkAT; downA (MkAT a) = Just a; downA _ = Nothing; -- Ashley Yakeley, Seattle WA

Re: Unicode support

2001-10-09 Thread Ashley Yakeley
. Lots of work for someone. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Unicode support

2001-10-09 Thread Ashley Yakeley
a codepoint has a non-Cn GC, it cannot be changed. But confusingly, some of the GCs are 'normative', whereas others are merely 'informative' -- perhaps these last are subject to revision. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL

Re: = vs -

2001-10-09 Thread Ashley Yakeley
At 2001-10-09 11:55, Mark Carroll wrote: What is the rationale for when Haskell demands a = and when it demands a -? What? Example please... -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org

5.02 .deb?

2001-10-06 Thread Ashley Yakeley
Is there a Debian package for GHC 5.02? -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

Empty Datatypes

2001-10-04 Thread Ashley Yakeley
? It isn't in 5.00.2. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: classes and instances

2001-10-04 Thread Ashley Yakeley
a = a, which is more general. You can restrict it to Int with (5 :: Int). -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: Haskell - Java and floats

2001-09-30 Thread Ashley Yakeley
tested it yet, though. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Unicode support

2001-09-30 Thread Ashley Yakeley
correspondence between any kind of n-bit unit and displayed characters. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Wish list: expanded defaulting, dependent types, reflection

2001-09-29 Thread Ashley Yakeley
a bug for this, see http://sourceforge.net/tracker/?func=detailaid=441389group_id=8032atid= 108032. I don't know if this has been fixed in 5.02. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman

Re: Wish list: expanded defaulting, dependent types, reflection

2001-09-29 Thread Ashley Yakeley
know about fundeps, right? This may help: class Add a b c | a b - c where {add :: a - b - c;}; -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

<    1   2   3   4   5   6   7   >