[Haskell] Re: Rebindable syntax for monads and arrows

2005-01-10 Thread Ashley Yakeley
in these cases? My own attitude tends towards if you don't specify type signatures, you get what you deserve, especially as I freely use implicit parameters. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman

[Haskell] Re: Rebindable syntax for monads and arrows

2005-01-10 Thread Ashley Yakeley
. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

Re: Using Haskell with Java

2005-01-08 Thread Ashley Yakeley
In article [EMAIL PROTECTED], Dmitri Pissarenko [EMAIL PROTECTED] wrote: Can Haskell and Java parts of a system co-operate? See my JVM-Bridge, https://sourceforge.net/projects/jvm-bridge/ -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users

[Haskell] Re: Never GADT Function?

2005-01-08 Thread Ashley Yakeley
BoolT :: T Bool IntT :: T Int neverT :: T Char - x neverT BoolT = hello neverT IntT = 37 Pick.hs:11:9: Inaccessible case alternative: Can't match types `Bool' and `Char' When checking the pattern: BoolT In the definition of `neverT': neverT BoolT = hello -- Ashley Yakeley

[Haskell-cafe] Two fun things with GADTs

2005-01-08 Thread Ashley Yakeley
castOne :: (Castable a,Castable b) = a - Maybe b castOne a = fmap runIdentity (cast (Identity a)) -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell] Re: Rebindable syntax for monads and arrows

2005-01-07 Thread Ashley Yakeley
:: (FinSet a) = Vec a - MyVec a instance Monad MyVec where return a = MkMyVec (vreturn a) etc. GADTs are scheduled for version 6.4 of GHC. The version of GHC now in CVS does not currently allow this however, see GHC bug #1097046. -- Ashley Yakeley, Seattle WA

[Haskell] Never GADT Function?

2005-01-07 Thread Ashley Yakeley
witnesses. Then again, I suppose it's the same situation for types with no constructors. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell-cafe] Re: Unicode: Hugs vs GHC (again) was: Re: Some random newbie questions

2005-01-07 Thread Ashley Yakeley
/. The Makefile fetches the tables from the Unicode web-site and generates Haskell from that, so they should all be correct. It's Unicode 3.2, so it's a bit out of date (current is 4.0.1), but it shouldn't be too hard to update. -- Ashley Yakeley, Seattle WA

[Haskell-cafe] Re: Initial (term) algebra for a state monad

2005-01-05 Thread Ashley Yakeley
for the passed context, because of this non-identity: mif (c1 `mplus` c2) t e /= mif c1 t e `mplus` mif c2 t e Is mif reducible to some melse with mif c t e = do ma - (c = return . Just) `melse` (return Nothing) case ma of Just a - t a Nothing - e ...? -- Ashley

[Haskell-cafe] Re: GHC for .NET?

2005-01-03 Thread Ashley Yakeley
the unsuitability of the Java VM for lazy functional languages. I wonder if the CLR also has issues for this? -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Re: Typed Lambda-Expressions withOUT GADTs

2005-01-02 Thread Ashley Yakeley
without Oleg's auxiliary t argument that in fact encodes the structure of the expression. Is that right? I certainly can't see any way of getting rid of it: if, as you say, you existentially package it, the compiler can't deduce runnability. -- Ashley Yakeley, Seattle WA

[Haskell-cafe] Re: Problem with fundeps.

2005-01-02 Thread Ashley Yakeley
(Vspace a v) = Vspace a (c-v) where This is incompatible with the previous instance declaration, since a is not the same as c - v. And any instance decl that were permitted by the fundep would in any case overlap. -- Ashley Yakeley, Seattle WA ___ Haskell

[Haskell-cafe] Re: Problem with fundeps.

2005-01-02 Thread Ashley Yakeley
type is q. The second says that if the vector type is p - q, then the scalar type is some other type r fulfilling Vspace r q. Which do you want, q, or (Vspace r q) = r? -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list Haskell-Cafe

[Haskell] Re: Initialisation without unsafePerformIO

2004-06-04 Thread Ashley Yakeley
String cast c = (writeChar c) readString -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: F#

2004-06-03 Thread Ashley Yakeley
language in a strict run-time environment. ... -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

Re: F#

2004-06-01 Thread Ashley Yakeley
on FFI, would you care to comment? I wonder if F# really is as obviously preferable to a Haskell# as they claim? -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow

Happy Question

2004-03-01 Thread Ashley Yakeley
of switching on monadic-ness, so I can have a monadic happyError, but without giving type signatures to happyThen and happyReturn? Or else allowing a class context for the type signatures? -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing

[Haskell] Re: exists keyword and existential types

2004-02-16 Thread Ashley Yakeley
; f2 :: something'; f3 :: something''; -- etc. }; This is a much better way of doing semi-OOP. AFAIK you can't really do proper OOP-style extensibility in Haskell at all (and exists wouldn't help either). -- Ashley Yakeley, Seattle WA

[Haskell] Re: non-ASCII characters in Haddock documentation

2004-02-14 Thread Ashley Yakeley
In article [EMAIL PROTECTED], Wolfgang Jeltsch [EMAIL PROTECTED] wrote: how do I insert non-ASCII and maybe even non-Latin-1 characters in Haddock documentation? Can't you use HTML entities? -- Ashley Yakeley, Seattle WA ___ Haskell mailing list

[Haskell] Re: Implicit parameters redux

2004-01-29 Thread Ashley Yakeley
polymorphic-friendly? -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

HBase Haddocumentation Available

2004-01-17 Thread Ashley Yakeley
I now have some haddock for HBase available to browse. There's only one module missing, Org.Org.Semantic.HBase.Category.Constant, due to a kind declaration. Thanks to Simon M. for creating an excellent documentation tool. http://hbase.sourceforge.net/haddock/ -- Ashley Yakeley, Seattle WA

Re: mfix as an effect

2004-01-12 Thread Ashley Yakeley
In article [EMAIL PROTECTED], [EMAIL PROTECTED] wrote: That is, Ashley Yakeley claimed that his Haskell implementation of Scheme implements letrec via Y -- and yet his implementation is consistent with the R5RS semantics, which mandates the updateable-cell letrec. I am in any case

Re: no continuations

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

Re: no continuations

2004-01-12 Thread Ashley Yakeley
) (set! x 1) (set! y 1) (c 0)) (+ x y Could you tell me what does this test return on your system? It causes hscheme to exit silently. Very odd. I'll try to fix it, but I suspect it's something fundamental to my design, and connected to precisely these issues. -- Ashley

ghc-pkg 6.2 incorrectly parses commas within quotes

2004-01-11 Thread Ashley Yakeley
with a correct ghc-pkg. -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-bugs mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs

Re: ghc-pkg 6.2 incorrectly parses commas within quotes

2004-01-11 Thread Ashley Yakeley
it... Might it not be better to do it this way? deps = base,haskell98,network [${deps},foo] = (expand $-reference) [base,haskell98,network,foo] = (quote things) [base,haskell98,network,foo] The idea is that unquoted things get implicitly quoted, so you don't need to quote ${deps}. -- Ashley

Re: JVM bridge

2004-01-11 Thread Ashley Yakeley
the quotes. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: Hi, I have a question!

2004-01-10 Thread Ashley Yakeley
In article [EMAIL PROTECTED], NamO [EMAIL PROTECTED] wrote: Mmmm. and then How can I solve this problem? Would you say the solution. Thank you. Either use a different name for your operator, or specify the + that you want by writing OperationTest.+ instead of +. -- Ashley

Re: JVM bridge

2004-01-09 Thread Ashley Yakeley
areas: GHC 6.2 changed something, or it's a GCC version thing. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: no continuations

2004-01-09 Thread Ashley Yakeley
to implement letrec, unless the implementation can prove that the difference is unobservable for the form in question. Do you have an example of use of Y for letrec where a program would violate R5RS? -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe

Re: no continuations

2004-01-09 Thread Ashley Yakeley
if you don't believe me. I'd be very interested to know if my implementation of Scheme varies from R5RS due to this issue. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: no continuations

2004-01-09 Thread Ashley Yakeley
. Again, I encourage you to try for yourself at http://hscheme.sourceforge.net/interpret.php (though it's a bit slow). -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: Hi, I have a question!

2004-01-09 Thread Ashley Yakeley
already a definition for (+) imported from the Prelude. When you write Succ (m + n) the interpreter doesn't know whether you mean the one you've just defined (OperationTest.+) or the one imported from the Prelude (Prelude.+). -- Ashley Yakeley, Seattle WA

GHC Warning Request

2003-12-28 Thread Ashley Yakeley
in knowing about superfluous imports. -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

Re: Why are strings linked lists?

2003-11-29 Thread Ashley Yakeley
other than ISO Latin-1 characters, none of the Haskell functions with Char in their signature will be of any use. Actually, many of those functions ought to use Word8 instead. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED

Re: Why are strings linked lists?

2003-11-29 Thread Ashley Yakeley
there's a burst of activity on the Libraries or the Internationalisation lists concerning this, but it never quite comes together somehow. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo

Re: ANNOUNCE: Haddock version 0.6

2003-11-23 Thread Ashley Yakeley
though, it seems to choke on explicit kind declarations, for instance: newtype Constant (m :: * - *) a = MkConstant a deriving (Eq); -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo

Re: Hypothetical reasoning in type classes

2003-11-16 Thread Ashley Yakeley
In article [EMAIL PROTECTED], Ken Shan [EMAIL PROTECTED] wrote: Just today (and not only today) I wanted to write instance definitions like instance (forall a. C a = D a) = E [a] where ... I've wanted this for awhile, in both class and instance declarations. -- Ashley Yakeley

ghc -cpp on Mac OS X

2003-11-11 Thread Ashley Yakeley
. There is NO warranty; not even for MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-bugs mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs

Re: How can I implement this arrow? Thanks

2003-09-17 Thread Ashley Yakeley
of Hughes' Arrow without some function for combining Strings. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: How can I implement this arrow? Thanks

2003-09-16 Thread Ashley Yakeley
has a better name. I'm not sure what the attached laws are, but I imagine they're fairly straightforward. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Where are higher-rank and existential types used?

2003-09-13 Thread Ashley Yakeley
xyxy (letrec ((a (cons 'x b)) (b (cons 'y a))) a)) (list-head xyxy 30) -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Circular Instance Declarations

2003-09-12 Thread Ashley Yakeley
In article [EMAIL PROTECTED] .com, Simon Peyton-Jones [EMAIL PROTECTED] wrote: OK, I yield! The HEAD now runs this program. It turned out to be a case of interchanging two lines of code, which is the kind of fix I like. Cool, thanks. -- Ashley Yakeley, Seattle WA

Re: Circular Instance Declarations

2003-09-10 Thread Ashley Yakeley
to find out what the free variables are. That's OK for Scheme, however, since Scheme doesn't complain about unbound variables until run-time. So, um, any excuse to talk about HScheme anyway. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL

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

2003-09-10 Thread Ashley Yakeley
such as rank-N and multi-parameter classes could be grouped under a single flag. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Weird Undecidable Instances Bug

2003-09-09 Thread Ashley Yakeley
program would be solvable in a finite amount of work. I guess one possibility might be to make such an instance decl illegal. Nooo!!! My workaround was simply to put the instance declaration in a later module. Then g type-checks fine. -- Ashley Yakeley, Seattle WA

Re: Weird Undecidable Instances Bug

2003-09-09 Thread Ashley Yakeley
behaviour. -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-bugs mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs

Weird Undecidable Instances Bug

2003-09-08 Thread Ashley Yakeley
': g = f $ ghc --version The Glorious Glasgow Haskell Compilation System, version 6.0.1 -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-bugs mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs

Re: Haskell for non-Haskell's sake

2003-09-07 Thread Ashley Yakeley
with papers? Most C++ and Java programmers don't write papers... -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Circular Instance Declarations

2003-09-07 Thread Ashley Yakeley
In article [EMAIL PROTECTED], Brandon Michael Moore [EMAIL PROTECTED] wrote: Detecting circularity in a derivation is equivalent to accepting a regular infinite derivation for instances. Would you have a use for irregular derivations? Could you give me an example? -- Ashley Yakeley

Circular Instance Declarations

2003-09-06 Thread Ashley Yakeley
of `==' at CircularInsts.hs:16 `Eq (D C)' arising from use of `==' at CircularInsts.hs:16 Would it be reasonable for the compiler to check back through the stack and allow the circularity? It will just create an ordinary recursive function. -- Ashley Yakeley, Seattle WA

Fundep Datatype Request

2003-09-04 Thread Ashley Yakeley
Word8 Word16-- UArray Int Word16 (a - b) -- Array Int (a - b) It would be nice to hide the implementation and just expose some type-constructor: MyCollection Word8 MyCollection Word16 MyCollection (a - b) I believe this can't be done currently. -- Ashley Yakeley, Seattle WA

Re: IO Bool - Bool

2003-08-24 Thread Ashley Yakeley
then putStrLn yes else return () Here result has type Bool. do blocks are magic conjured from sugar and syntax. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: Monads and Maybe

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

Re: Implicit parameters, second draft

2003-08-14 Thread Ashley Yakeley
these be unified in any useful way? -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Calling Haskell from Java

2003-08-14 Thread Ashley Yakeley
/lambada-0-1.zip -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: The madness of implicit parameters: cured?

2003-08-11 Thread Ashley Yakeley
} Not unless you give an explicit type signature, no. So effectively your proposal is the same as the existing implicit parameter mechanism, except that the compiler is a bit stricter in certain cases where the types are ambiguous? -- Ashley Yakeley, Seattle WA

Re: Implicit parameters, second draft

2003-08-09 Thread Ashley Yakeley
braces. Currently they're used to mark blocks when layout isn't used. Might this clash? IIRC braces are used after do, where, let, in and of (probably OK), and also for data structures with named fields. -- Ashley Yakeley, Seattle WA ___ Haskell

Re: The madness of implicit parameters: cured?

2003-08-05 Thread Ashley Yakeley
= ((b,[EMAIL PROTECTED] - @x) [EMAIL PROTECTED] = 2}) -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: ANNOUNCE: GHC version 6.0.1

2003-08-04 Thread Ashley Yakeley
time. /usr/bin/ghc etc. links don't work out of the box. It looks like your post-install script needs to call update-alternatives on the four links. -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http

Re: The madness of implicit parameters: cured?

2003-08-04 Thread Ashley Yakeley
types can f have here? Which if any should the compiler infer? f a b = (a,b) [EMAIL PROTECTED] = 2} And given that type, which of these are valid? f ?x ?x f ?x 1 f 1 ?x f 1 1 -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL

Re: The madness of implicit parameters: cured?

2003-08-04 Thread Ashley Yakeley
as ordinary names? (\a - ((\a - a) 1,a)) 2 ((\a - a) 1,2) (1,2) -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: The madness of implicit parameters: cured?

2003-08-04 Thread Ashley Yakeley
PROTECTED] - @x) [EMAIL PROTECTED] = 1} -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: The madness of implicit parameters: cured?

2003-08-03 Thread Ashley Yakeley
PROTECTED] = 1} (((\_ - [EMAIL PROTECTED] - @x) [EMAIL PROTECTED] = 2}) ([EMAIL PROTECTED] - @x))[EMAIL PROTECTED] = 1} ((\_ - 2) ([EMAIL PROTECTED] - @x))[EMAIL PROTECTED] = 1} (\_ - 2) 1 2 Again, it all depends on the type of 'g'. -- Ashley Yakeley, Seattle WA

Re: The madness of implicit parameters: cured?

2003-08-03 Thread Ashley Yakeley
position. It might be better to use a different syntax rather than overload (-) with something that isn't a type-constructor. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: ANNOUNCE: Haddock version 0.5

2003-07-28 Thread Ashley Yakeley
In article [EMAIL PROTECTED] .com, Simon Marlow [EMAIL PROTECTED] wrote: Haddock version 0.5 is released. Any chance it might parse implicit parameters in the near future? I use implicit parameters in all my Haskell projects... -- Ashley Yakeley, Seattle WA

ANNOUNCE: Haskell/Java VM Bridge 0.2.1 Release

2003-07-23 Thread Ashley Yakeley
://sourceforge.net/projects/jvm-bridge/ Future plans: * port to Cygwin * use hierarchical module structure * separate out pure (non-FFI) Haskell into a separate package * better typing for the IO-based layer -- Ashley Yakeley, Seattle WA Almost empty page: http://semantic.org

Re: -fno-implicit-prelude -prof bug on x86

2003-07-21 Thread Ashley Yakeley
: `NULL' undeclared here (not in a function) /tmp/ghc4124.hc:5: initializer element is not constant /tmp/ghc4124.hc:5: (near initialization for `M_CAFs_cc_ccs[0].indexTable') Workaround: pass -optc-DNULL=0 to GHC. -- Ashley Yakeley, Seattle WA

Superclass Defaults

2003-07-21 Thread Ashley Yakeley
of the superclass. 4. It should be possible to distinguish between different appearances of the same class in the superclass context. For instance: class C a where c :: Int - a class (C a,C b,C (a - b)) = D a b where ... Any ideas? -- Ashley Yakeley

HScheme Status

2003-07-20 Thread Ashley Yakeley
to see if I can find out just why. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: new debian packages and archive: haskell experimental

2003-07-17 Thread Ashley Yakeley
In article [EMAIL PROTECTED], Isaac Jones [EMAIL PROTECTED] wrote: I've set up a Debian archive (apt source) for experimental Haskell packages and backports. Thanks to you and Ian Lynagh for doing this. -- Ashley Yakeley, Seattle WA ___ Haskell

-fno-implicit-prelude -prof bug on x86

2003-07-16 Thread Ashley Yakeley
is removed. It successfully compiles on MacOS X. $ ghc --version The Glorious Glasgow Haskell Compilation System, version 6.0 $ uname -a Linux rollright 2.4.18-686 #1 Sun Apr 14 11:32:47 EST 2002 i686 GNU/Linux -- Ashley Yakeley, Seattle WA ___ Glasgow

Re: Arrow Classes

2003-07-15 Thread Ashley Yakeley
. It works in extended Haskell however, so I suspect it lays to rest the question of needing some other language extension. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: Arrow Classes

2003-07-12 Thread Ashley Yakeley
a; And now you can write this: invert :: Num a = Matrix a - Matrix a I use this idiom quite frequently for joining classes together. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman

Re: Decimal Literals

2003-07-12 Thread Ashley Yakeley
this. In this case it tells me the simplest rational is 22/7. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: Template Haskell question

2003-07-12 Thread Ashley Yakeley
is to be able to splice in several types that are all connected in the context. (C1 a b,C2 b c) = $(foo [t|a|] [t|b|] [t|c|]) Right now I'm using m4, the textual preprocessor. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED

Re: How overload operator in Haskell?

2003-07-11 Thread Ashley Yakeley
some overlapping instance, I think it's quite OK. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: How overload operator in Haskell?

2003-07-11 Thread Ashley Yakeley
a b a) = a - b - a; -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Arrow Classes

2003-07-10 Thread Ashley Yakeley
In article [EMAIL PROTECTED], Ross Paterson [EMAIL PROTECTED] wrote: The point about symmetry is a fair one, but unfortunately the Haskell class system imposes a cost on fine-grained class hierarchies, It does? -- Ashley Yakeley, Seattle WA

Re: Arrow Classes

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

Re: Arrow Classes

2003-07-10 Thread Ashley Yakeley
a,forall b. Functor (a b)) = BiFunctor a Unfortunately, foralls are not allowed in class or instance contexts... -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Decimal Literals

2003-07-10 Thread Ashley Yakeley
digits of other rationals, for instance 0._3 = 1/3 0.29_54 = 13/44 etc. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: Language extension proposal

2003-06-30 Thread Ashley Yakeley
to implement. -- Ashley Yakeley, Seattle WA Almost empty page: http://semantic.org/ ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Language extension proposal

2003-06-28 Thread Ashley Yakeley
= MkType. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Language extension proposal

2003-06-27 Thread Ashley Yakeley
have to write (MkType :: Type MyFloat). Syntactic sugar for _that_ would be useful. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Template Haskell question

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

Re: MacOS X Project Builder and Haskell

2003-06-25 Thread Ashley Yakeley
. -- Ashley Yakeley, Seattle WA Almost empty page: http://semantic.org/ ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: MacOS X Project Builder and Haskell

2003-06-23 Thread Ashley Yakeley
directly. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell-cafe

Language-Independent Arithmetic

2003-06-21 Thread Ashley Yakeley
been relegated to a library. Is this true? Which library? -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Haskell.org out of date

2003-06-14 Thread Ashley Yakeley
. The idea is, people would contribute test-code for a given wish they have, and the test would succeed for any compiler that implemented the wish. -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman

Re: Typesafe MRef with a regular monad

2003-06-13 Thread Ashley Yakeley
this. George Russell already showed this, didn't he? You can implement Typeable given type-safe MRefs, and you can implement type-safe MRefs given Typeable. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http

Re: for all quantifier

2003-06-08 Thread Ashley Yakeley
something of type (forall a. a) such as undefined in a MyType2. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

Re: Fudgets

2003-06-08 Thread Ashley Yakeley
advances in Haskell as monadic IO? I must confess I'm not all that familiar with Fudgets, although it certainly looks interesting. For what sort of problems is it currently the best solution? -- Ashley Yakeley, Seattle WA ___ Haskell-Cafe mailing

Re: Typesafe MRef with a regular monad

2003-06-05 Thread Ashley Yakeley
with forall s. ST s E (for some type-expression E) if E contains s (which it does in this case). -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

ExtractableFunctors and Some HScheme Internals Explained

2003-06-05 Thread Ashley Yakeley
)) (abstracter body) foo is what I'm working on currently. I had an earlier version that only worked with the pure functional flavour of HScheme; I'm now generalising it with mfix. It's all in CVS... http://sourceforge.net/cvs/?group_id=47823 -- Ashley Yakeley, Seattle WA

Re: Implementing RefMonads in Haskell without ST,IO

2003-06-04 Thread Ashley Yakeley
be able to construct coerce :: a - b just as you can with unsafePerformIO. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/haskell

RE: Ways and Build Tags for Optimisation

2003-06-02 Thread Ashley Yakeley
take about six hours (GHC 5.04.3 for MacOS X). -- Ashley Yakeley, Seattle WA Almost empty page: http://semantic.org/ ___ Glasgow-haskell-bugs mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs

Re: Eval in Haskell

2003-06-02 Thread Ashley Yakeley
-eval exp (local-environment guile (eval-where-x-bound '(list 'x x)) (x foo) Guile seems to be a bit sloppy in general. I think it just keeps a dictionary of symbol bindings and passes it around at runtime. guile (eval '(define b 5)) guile b 5 -- Ashley Yakeley, Seattle WA

Re: Ways and Build Tags for Optimisation

2003-05-30 Thread Ashley Yakeley
to simply switch off profiling just for these few files? Also, I'd like to make all that data disappear when a binary program that doesn't use it is stripped; currently it doesn't. Any ideas? -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users

Ways and Build Tags for Optimisation

2003-05-29 Thread Ashley Yakeley
speaks of ways and build tags but I can't find any reference to these in the GHC manual. How would I use one of the user ways? -- Ashley Yakeley, Seattle WA ___ Glasgow-haskell-users mailing list [EMAIL PROTECTED] http://www.haskell.org/mailman

<    1   2   3   4   5   6   7   >