Re: [Haskell] ANNNOUNCE: lens 3.7 released

2012-12-09 Thread Ashley Yakeley
On 07/12/12 02:19, Edward Kmett wrote: I am happy to announce the release of version 3.7 of the lens package, which provides "Lenses, Folds, and Traversals" for working with arbitrary data types. Do you use types to index the fields of tuples? It's a good general mechanism to represent the "t

[Haskell] ANN: time-1.4.0.2

2012-11-25 Thread Ashley Yakeley
7;m now making use of the test-framework package, which does play well with QuickCheck. -- Ashley Yakeley ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

Re: [Haskell] Spam on the Haskell wiki

2012-07-14 Thread Ashley Yakeley
composing this email.) Certainly > the deletion > and block logs are long enough: > > - > > http://www.haskell.org/haskellwiki/index.php?title=Special%3ALog&type=delete&user=&page= > - > > http:

[Haskell] Announce: time-1.3

2011-08-09 Thread Ashley Yakeley
I've uploaded time-1.3 to Hackage. Version 1.3 adds "instance RealFrac DiffTime". -- Ashley ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

Re: [Haskell] ANNOUNCE: time-recurrence-0.1

2011-05-21 Thread Ashley Yakeley
nday of a month" never happens. Simply searching into the past for one would never terminate. Either I would have to restrict the language, or assert the beginning of time (not necessarily a bad solution). Anyway, a possible project for you or someone

[Haskell] ANNOUNCE: time-1.2.0.5

2011-05-11 Thread Ashley Yakeley
I've uploaded time-1.2.0.5 to Hackage. Version 1.2.0.5 fixes two parsing issues in 1.2.0.4. Firstly, the default century (in the absence of %C or %Y) is 1969-2068. Formerly it was 1900-1999. http://hackage.haskell.org/trac/ghc/ticket/2671 Secondly, %-, %_ and %0 specifiers can now be used. Fo

[Haskell] ANNOUNCE: time-1.2.0.4

2011-02-02 Thread Ashley Yakeley
ust *** Exception: Prelude.read: no parse Specifically: > parseTime defaultTimeLocale "%e" "" :: Maybe Day > -- Just *** Exception: Prelude.read: no parse In time-1.2.0.4, they now correctly evaluate to Nothing. I've updated the unit tests to catch this too. --

[Haskell] Top Level

2009-06-16 Thread Ashley Yakeley
different things: doing stuff with images is graphics but not UI, while ncurses or even a command-line is UI but not graphics. -- Ashley Yakeley ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] HaskellWiki Accounts

2009-02-07 Thread Ashley Yakeley
I just discovered I can create HaskellWiki accounts really easily. If you want one, email me your desired username. Medial spaces are allowed in usernames (just as they are in article titles). -- Ashley Yakeley ___ Haskell mailing list Haskell

[Haskell] HaskellWiki Update

2009-01-17 Thread Ashley Yakeley
; 3. blocked at least some of the remaining spam accounts. This is obviously not ideal, as there is now no way for new users to edit the wiki. I will investigate appropriate ways to allow account creation. -- Ashley Yakeley ___ Haskell mailing list

[Haskell] HaskellWiki Upgrade Aborted

2009-01-10 Thread Ashley Yakeley
l-DBD-MySQL-2.1021-4.EL3 libmysqlclient.so.10 is needed by (installed) php-mysql-4.3.2-48.ent I don't know what mod_auth_mysql and perl-DBD-MySQL are being used for, so I don't believe I can upgrade them safely. The machine is running RHEL AS 3 update 9 with Linux 2.4.21. --

[Haskell] haskell.org HTTP Interruption for Upgrade

2009-01-10 Thread Ashley Yakeley
Ashley Yakeley wrote: I wrote: I will be upgrading HaskellWiki to the latest stable version of MediaWiki (1.13.3) over the next few hours. The plan is this: 1. Switch off HaskellWiki. This may involve switching off the Apache server running haskell.org. 2. Dump the database to a file. 3

[Haskell] Re: HaskellWiki Interruption for Upgrade

2009-01-10 Thread Ashley Yakeley
. 4. Run its upgrade process. 5. Install useful extensions. I'm currently looking at this: http://www.mediawiki.org/wiki/Manual:Combating_spam 6. Tweak config file. 7. Switch everything back on. 8. Post again here. I will also need up upgrade both PHP and MySQL. -- Ashley Ya

[Haskell] HaskellWiki Interruption for Upgrade

2009-01-10 Thread Ashley Yakeley
its upgrade process. 5. Install useful extensions. I'm currently looking at this: http://www.mediawiki.org/wiki/Manual:Combating_spam 6. Tweak config file. 7. Switch everything back on. 8. Post again here. -- Ashley Yakeley ___ Haskell mailing

[Haskell] Spam on HaskellWiki

2008-12-13 Thread Ashley Yakeley
relatively harmless. However, it is only available with MediaWiki 1.9 and later, and HaskellWiki is running MediaWiki 1.5.4, so this means doing an upgrade. The current stable release is 1.13.2. -- Ashley Yakeley ___ Haskell mailing list Haskell@haskel

[Haskell] Re: Linking Multiple Versions of the Same Package

2008-09-01 Thread Ashley Yakeley
I wrote: Thus Sorry, that was accidentally sent early, and after I discovered that package versions are in fact recorded in External Core names. Please ignore... -- Ashley Yakeley ___ Haskell mailing list Haskell@haskell.org http

[Haskell] Linking Multiple Versions of the Same Package

2008-09-01 Thread Ashley Yakeley
I tried doing this out of curiosity. Package B links to version 0.1 of open-witness, while package C links to B and version 0.1.1 of open-witness. Cabal stopped me when doing "cabal configure" in C: $ cabal configure Configuring C-0.1... Warning: This package indirectly depends on multipl

[Haskell] Top Level <-

2008-08-24 Thread Ashley Yakeley
; My open-witness package, which also shows how to do Typeable/Dynamic safely: <http://hackage.haskell.org/cgi-bin/hackage-scripts/package/open-witness> -- Ashley Yakeley Seattle, WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] ANN: witness 0.1, open-witness 0.1, "Witnesses and Open Witnesses"

2008-08-18 Thread Ashley Yakeley
the creation of them at top-level. We show how this solves the expression problem, all with relatively little implementation fuss. draft, rejected from the Haskell Symposium 2008 <http://semantic.org/stuff/Open-Witnesses.pdf> -- Ashley Yakeley Seattle, WA

[Haskell] Blocked STM & GC question

2007-09-15 Thread Ashley Yakeley
where, will the permanently blocked thread still sit around using up some small amount of memory, or will it be reaped by the garbage collector? -- Ashley Yakeley Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/ma

[Haskell] Re: ghc.haddock?

2007-08-15 Thread Ashley Yakeley
clear up the rather confusing naming scheme? So presumably ghc.haddock provides some new API that haddock.ghc uses to get parse information? -- Ashley Yakeley ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: Who pays for *.haskell.org machines?

2007-06-13 Thread Ashley Yakeley
. This is excellent news. I had considered moving the JVM-Bridge darcs repo to darcs.haskell.org, but I wasn't sure if it was appropriate (unlike the standard time library, which definitely belongs there). -- Ashley Yakeley ___ Haskell mailing

[Haskell] Implicit Parameters in Instance Declarations

2007-05-14 Thread Ashley Yakeley
Would horrible things happen if implicit parameters were allowed as contexts in instance declarations? instance (?limit :: Int) => Eq Thing where ... -- Ashley Yakeley ___ Haskell mailing list Haskell@haskell.org http://www.haskell.

[Haskell] HNOP Status

2007-01-05 Thread Ashley Yakeley
rence output. But should I be using QuickCheck or something here? Is there some well-known or Cabal-approved way to run tests on a package? Please send me patches licensed under the simple permissive license in the LICENSE files if you have any improvements. Or I can move this

[Haskell] HaskellWiki Style Help

2006-11-15 Thread Ashley Yakeley
have also turned on numbered headings for when not logged in. Logged-in users can set this option at Preferences -> Misc. I'm not sure it's an improvement, however; it makes the front page look a bit odd. -- Ashley Yakeley ___

[Haskell] Re: HaWiki closing in one month; migrate content to HaskellWiki now!

2006-10-02 Thread Ashley Yakeley
/haskellwiki/HaskellWiki:Copyrights for those new to this :). I'm not a lawyer, but I'm pretty sure we can't give licenses to other people's work. However, we can email users asking them to license their HaWiki work. -- Ashley Yakeley Seattle WA ___

[Haskell] Re: Implicit type of numeric constants

2006-09-20 Thread Ashley Yakeley
Arie Peterson wrote: You absolutely right about this defaulting breaking referential transparency. Do you know if it can be switched off in GHC? I know one can switch on warnings when it happens, but I don't think that's the same thing. -- Ashl

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

2006-09-08 Thread Ashley Yakeley
Stephan Swiderski wrote: Dear all, we are pleased to announce the integration of an automatic Haskell98 termination analyzer Cool! So are there an infinite number of twin primes or not? -- Ashley Yakeley Seattle, WA ___ Haskell mailing list

[Haskell] Re: ANNOUNCE: HNOP 0.1

2006-06-30 Thread Ashley Yakeley
benefit from a configure script and autotools. > But it's a great start. Thanks! -- Ashley Yakeley Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: ANNOUNCE: HNOP 0.1

2006-06-30 Thread Ashley Yakeley
s would actually not be too hard to write, given my existing work, and then of course the executable would simply be a thin wrapper. -- Ashley Yakeley Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: ANNOUNCE: HNOP 0.1

2006-06-30 Thread Ashley Yakeley
In article <[EMAIL PROTECTED]>, [EMAIL PROTECTED] (Donald Bruce Stewart) wrote: > > Cool, that's awesome. But I don't see any Haddock docs? Or a Cabal > > Setup.hs? Would it be much trouble to add them? > > Done. See attached patch. :) Applied, than

[Haskell] ANNOUNCE: HNOP 0.1

2006-06-29 Thread Ashley Yakeley
rting point for more complex Haskell projects. -- Ashley Yakeley Seattle, WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: ANNOUNCE: FPS - FastPackedStrings 0.2

2006-04-20 Thread Ashley Yakeley
umably Latin-1) is just the sort of thing that leads to text encoding errors and the kind of general programmer confusion over types that Haskell is supposed to prevent. -- Ashley Yakeley, Seattle WA WWED? http://www.cs.utexas.edu/users/EWD/ ___ Ha

[Haskell] Re: ANNOUNCE: FPS - FastPackedStrings 0.2

2006-04-20 Thread Ashley Yakeley
functions. -- Ashley Yakeley, Seattle WA WWED? http://www.cs.utexas.edu/users/EWD/ ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: ANNOUNCE: FPS - FastPackedStrings 0.2

2006-04-19 Thread Ashley Yakeley
tring turns out to be an array of Word8, why are you using Char at all? Confusion of Char and Word8 is a bit of a pet peeve of mine. -- Ashley Yakeley, Seattle WA WWED? http://www.cs.utexas.edu/users/EWD/ ___ Haskell mailing list Haskell@haskell.org

[Haskell] Re: Haskell as a disruptive technology?

2006-03-27 Thread Ashley Yakeley
Paul Johnson wrote: I've never used Visual Haskell, but from the web page two things stand out: 1: Its version 0.0. This is not for production use. Also: "You may not use or distribute this Software or any derivative works in any form for commercial purposes."

[Haskell] Re: Implicit Parameters

2006-02-28 Thread Ashley Yakeley
perfectly well for the OS example you give, for example. Interesting. What would that look like in code? -- Ashley Yakeley ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Implicit Parameters

2006-02-27 Thread Ashley Yakeley
: timeFunction :: forall m a. (Monad m,?getCPUTime :: m Integer) => m a -> m (Integer,a) In a future Haskell Operating System, this is how system functions could be provided to application code. This would make secure sandboxes easy to set up, for instance. -- Ashley Yakeley

[Haskell] Re: generic catch in a MonadIO

2006-02-08 Thread Ashley Yakeley
Taral wrote: On 2/8/06, Ashley Yakeley <[EMAIL PROTECTED]> wrote: IIRC, that subset is types that can implement this: class (MonadIO m) => StrictMonadIO m where getUnliftIO :: m (m a -> IO a) You probably mean "m (forall a. m a -> IO a)" and that is not all

[Haskell] Re: generic catch in a MonadIO

2006-02-08 Thread Ashley Yakeley
[EMAIL PROTECTED] wrote: The ability to use functions 'catch', 'bracket', 'catchDyn', etc. in MonadIO other than IO itself has been a fairly frequently requested feature: ... The reason it is not implemented is because these functions cannot be defined for a general MonadIO. However, these func

[Haskell] Re: Type synonyms in the instance head

2006-02-02 Thread Ashley Yakeley
ortAndTellingName You can do this instead: type ShortAndTellingName = LongAndUglyName -- Ashley Yakeley ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Idioms and Proposals

2006-02-01 Thread Ashley Yakeley
I've added a few Haskell idioms and proposals (well, ideas for changes) to the wiki: http://haskell.org/haskellwiki/Category:Idioms http://haskell.org/haskellwiki/Category:Proposals I particularly wanted to include "perennial" ideas that often seem to get discovered independently (for instance

[Haskell] Re: Type-Level arithmetic library

2006-01-30 Thread Ashley Yakeley
Robert Dockins wrote: While cleaning up my home directory, I discovered some code I worked on a while ago which implements type level arithmetic. I know for the usual Peano representation of natural numbers, at least, it's possible to represent addition and subtraction with a single class wi

[Haskell] Re: page names on the new Haskell wiki

2006-01-30 Thread Ashley Yakeley
, we should agree on this point here before doint further page renamings. Best wishes, Wolfgang Not that I'm anyone important, but I have no problem with that (lower case except for first word). This is also what Wikipedia does. -- Ashley Ya

[Haskell] Re: page names on the new Haskell wiki

2006-01-27 Thread Ashley Yakeley
Sam Goldman wrote: Wolfgang Jeltsch wrote: I just started moving pages. But know I wonder which case I should use for inner-title words. Should the page title be "Books and tutorials" or "Books and Tutorials", for example? Since pages are only small documents, I chose the lower-case altern

[Haskell] Re: page names on the new Haskell wiki

2006-01-27 Thread Ashley Yakeley
Wolfgang Jeltsch wrote: Hello, the names of the pages of the new MediaWiki-driven Haskell wiki are often rather directory names than "article titles" as they are on Wikipedia. For example, the page "Books and tutorials about Haskell" isn't named "Books and tutorials about Haskell" or "Books

[Haskell] Re: haskell.org Simple Permissive License

2006-01-16 Thread Ashley Yakeley
of" intended? Whoops, no. I think it's safe to leave, though? -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: haskell.org Simple Permissive License

2006-01-13 Thread Ashley Yakeley
This is done now, with a mandatory simple permissive license. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] haskell.org Simple Permissive License

2006-01-12 Thread Ashley Yakeley
I'm sorry this is dragging on so long. It seems public domain is hard, both in the U.S. and in certain European jurisdictions. And people want a disclaimer. I did come across the MIT license, which may be close. Here is my non-expert attempt

[Haskell] Re: haskell.org Public Domain

2006-01-12 Thread Ashley Yakeley
rd, even just for the United States. <http://www.lessig.org/blog/archives/001066.shtml> CC public domain dedication: <http://creativecommons.org/licenses/publicdomain/> -- Ashley Yakeley ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: haskell.org Public Domain

2006-01-12 Thread Ashley Yakeley
out any conditions, unless such conditions are required by law." -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: haskell.org Public Domain

2006-01-12 Thread Ashley Yakeley
mmons.wikimedia.org/wiki/Commons:Donate_to_the_public_domain> Application of the license will be mandatory for all contributions to the wiki (but not other places on haskell.org). If that needs to be changed, it can be done so later. -- Ashley Yakeley, Seattle WA

[Haskell] Re: haskell.org Public Domain

2006-01-12 Thread Ashley Yakeley
ed in the public domain, the Work may be freely reproduced, distributed, transmitted, used, modified, built upon, or otherwise exploited by anyone for any purpose, commercial or non-commercial, and in any way, including by methods that have not yet been invented or conceived." --

[Haskell] Re: haskell.org Public Domain

2006-01-12 Thread Ashley Yakeley
ingly, by explicit attribution in the content itself. Let's start with a mandatory "public domain/all rights given away". If we find we need to include copyrighted material, it can be changed later without too much trouble. I don't want to keep the GFDL there any longer. -

[Haskell] Re: haskell.org Public Domain

2006-01-11 Thread Ashley Yakeley
. What about this one? <http://commons.wikimedia.org/wiki/Commons:Donate_to_the_public_domain> "I, the creator of this work, hereby release it into the public domain. This applies worldwide. "In case this is not legally possible: "I grant anyone the right to use th

[Haskell] Re: haskell.org Public Domain

2006-01-11 Thread Ashley Yakeley
he wiki is probably better. A link from the wiki to where? The wiki is supposed to take over the haskell.org site. But maybe we can still have directories that are not part of the wiki. -- Ashley Yakeley ___ Haskell mailing list Haskell@haskel

[Haskell] Re: haskell.org Public Domain

2006-01-11 Thread Ashley Yakeley
ay of saying "You can do what you like with this material". We won't be able to include the Haskell 98 Report on the wiki (which is intended to replace the entire haskell.org site) because it has a more restrictive license. -- Ashley Yakeley ___

[Haskell] Re: haskell.org Public Domain

2006-01-11 Thread Ashley Yakeley
rant anyone the right to use this work for any purpose, without any conditions, unless such conditions are required by law." I'd rather use this than attempt to draw up my own. -- Ashley Yakeley ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: haskell.org Public Domain

2006-01-11 Thread Ashley Yakeley
Wolfgang Jeltsch wrote: Wikipedia stores and displays IP addresses if the user which did the edit wasn't logged in. This is disabled in HaskellWiki; you have to log in to edit. I did this because hawiki apparently had had some problems with vandalism and had done the same thing. -- A

[Haskell] Re: haskell.org Public Domain

2006-01-11 Thread Ashley Yakeley
nyone want to draw one up? -- Ashley Yakeley ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: haskell.org Public Domain

2006-01-11 Thread Ashley Yakeley
ssion" and "Edit" on the > top of the page? They're at the bottom of the page. I tried to make the default "skin" as quiet as possible. Once you log in, you can use a different skin, or switch on the "quickbar". -- Ashley Yakeley, Seattle WA __

[Haskell] Re: haskell.org Public Domain

2006-01-10 Thread Ashley Yakeley
o add text to satisfy German law, etc. The [[Project:Copyrights]] page will have the statement. The big question is the "one license" thing. Some people think other licenses should be allowed, provided they're marked on the page. <http://haskell.org/haskellwiki/Has

[Haskell] Re: haskell.org Public Domain

2006-01-10 Thread Ashley Yakeley
ing pitfalls is best left to lawyers and other parasi^W specialists. Should we make public domain mandatory or should we allow people to add notices to pages for other licenses? <http://haskell.org/haskellwiki/HaskellWiki:Community_Portal&g

[Haskell] Re: New look for haskell.org: MediaWiki

2006-01-09 Thread Ashley Yakeley
Sebastian Sylvan wrote: Is there a way to typeset Haskell syntax yet? Not yet, but someone could write an extension to do that... <http://meta.wikimedia.org/wiki/Extending_wiki_markup> -- Ashley Yakeley ___ Haskell mailing list Haskell@haske

[Haskell] Re: haskell.org Public Domain

2006-01-09 Thread Ashley Yakeley
Cale Gibbard wrote: As long as that's just the default and not required of course. No, all contributions would be in the public domain. It might be nice to at least include some disclaimers of warranty. Good idea. -- Ashley Yakeley ___ Ha

[Haskell] haskell.org Public Domain

2006-01-09 Thread Ashley Yakeley
to be a consensus for public domain both here and on the wiki page. <http://haskell.org/haskellwiki/HaskellWiki:Community_Portal> Does anyone have any objections to putting everything in the public domain? -- Ashley Yakeley, Seattle WA ___ H

[Haskell] Re: License for haskell.org content

2006-01-08 Thread Ashley Yakeley
an. > > Apart from the issue of code itself on the wiki, that other people have > already mentioned, presumably you'd also have licence fun if you try to > take surrounding explanatory text to use as haddock docs etc. Let's discuss it on the wiki: <http://haskell.org/hask

[Haskell] Re: (small) records proposal for Haskell '06

2006-01-03 Thread Ashley Yakeley
David Roundy wrote: On Mon, Jan 02, 2006 at 04:23:32PM -0800, Ashley Yakeley wrote: One open question (in my mind) would be whether we'd allow data Foo = FooInt { foo :: Int } | FooChar { foo :: Char } In the "new" system, there's no reason this need be illegal. H

[Haskell] Re: (small) records proposal for Haskell '06

2006-01-02 Thread Ashley Yakeley
eed be illegal. How would this behave? data Foo a b = FooA {foo :: a} | FooB {foo :: b} -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: Boxing (Day) Question

2005-12-29 Thread Ashley Yakeley
o you don't think having a different kind for each kind of storage (e.g. #4 for 4-byte values, etc.) would help you here? -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: Making Haskell more open

2005-12-28 Thread Ashley Yakeley
For me, this is much more valuable than integration with bugs or source control. -- Ashley Yakeley ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: Boxing (Day) Question

2005-12-28 Thread Ashley Yakeley
sm", which would mostly end up as compile-time overloading (or inlined) similar to C++ templates. For instance: (#,#) :: #m -> #n -> #m+n I'm not really sure how much demand there is for it, mind, given the possible degree of complexity

[Haskell] Re: Boxing (Day) Question

2005-12-26 Thread Ashley Yakeley
FI. It also might be interesting to allow user definition of certain kinds of unboxed datatypes, similar to C++ enumerations. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: Boxing (Day) Question

2005-12-26 Thread Ashley Yakeley
ries, rather than dictionaries being stored inside values? For instance: class C (x :: #4) where ... foo :: (C x) => x -> Bool foo x = ... might be generate something like this: HsBool foo (CDict dict,int32 x) { ... } > but i'm totally agree that we must have C++-like co

[Haskell] Re: Boxing (Day) Question

2005-12-26 Thread Ashley Yakeley
t; of them, but none of them are pleasent.) Oh, I hadn't thought of that. One solution might be to have a kind for each kind of storage: * for boxed values #4 for 4-byte values #8 for 8-byte values #P for pointers to things that need to be GC'd (or whatever) etc. Do you thi

[Haskell] Boxing (Day) Question

2005-12-26 Thread Ashley Yakeley
restriction that values in type constructors have types of kind "*". It is merely the notion of "#-freeness" that seems unnecessary. It would, however, allow this: newtype Box (u :: #) = MkBox (() -> u) ...and quite possibly this: newtype Value (x :: ?) = MkValue (() -> x) I believe these can be compiled safely? -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: Making Haskell more open

2005-12-23 Thread Ashley Yakeley
on its wiki? -- Ashley Yakeley ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: Making the haskell.org website more open with a wiki? was Re: Making Haskell more open

2005-11-13 Thread Ashley Yakeley
se (since it seems to be the standard one for Haskell libraries). People could then carefully copy across their contributions... I am willing to help out with MediaWiki if it is decided to go that route. Prerequisites for MediaWiki are PHP and MySQL. -- Ashley Yakeley, Seattle WA _

[Haskell] Re: Making Haskell more open

2005-11-11 Thread Ashley Yakeley
s of PDF, etc. by adding this to your LocalSettings.php: $wgCheckFileExtensions = false; $wgStrictFileExtensions = false; Even with these settings, dangerous content such as .php, .js and .html files is prevented. Uploaded PDFs work fine, and display inline as the PDF logo

[Haskell] Re: Making Haskell more open

2005-11-11 Thread Ashley Yakeley
resent the information in any other, just as any Haskell program can be rewritten in Visual Basic. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: Making Haskell more open

2005-11-10 Thread Ashley Yakeley
y valuable are the elimination of RunTogetherWordLinks and the separation of article and talk spaces. I've set up a MediaWiki site for my own private use, and that at least wasn't too hard. It's all PHP/MySQL. Of course, there might be a better solution

[Haskell] Non-Copyleft Haskell SOAP/WSDL library?

2005-11-10 Thread Ashley Yakeley
Does anyone know of a non-copyleft open-source SOAP/WSDL library for Haskell? HAIFA is GPL apparently. Something like the usual BSD license would be perfect. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http

[Haskell] Re: getArgs, maxBound, float division: pure functions?

2005-10-24 Thread Ashley Yakeley
:: Handle, ?filesystem :: FileSystem, ?internets :: [InternetConnection], ?gettime :: IO UTCTime, ... ) => [String] -> IO ReturnCode Of course, this would make a bit more sense if there were a mechanism for applying type contexts to modules, so that they applied to all declared t

[Haskell] Re: PROPOSAL: class aliases

2005-10-14 Thread Ashley Yakeley
at last rename Monad "WarmFuzzyThing"... -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: PROPOSAL: class aliases

2005-10-14 Thread Ashley Yakeley
Prelude. Basically if it lets me do Functor => Idiom => Monad, and still compile earlier code, I'm for it. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: ANNOUNCE: Visual Haskell version 0.0

2005-09-27 Thread Ashley Yakeley
You have the option of using Visual > Haskell either under the click-through license in the installer (a > Microsoft shared source license for non-commercial use) or the more > liberal BSD license in the documentation. Will you be coming out with another installer? I'm not comfortable c

[Haskell] Object-Orientation and Haskell

2005-09-24 Thread Ashley Yakeley
ybe fromDynamic1 (MkMaybe gm) = Just gm fromDynamic1 _ = Nothing I submit that this is "hairy" rather than "ugly", but I suspect the Type-Constructors Of Unusual Kind (TCOUKs) get even hairier for Typeable2, Typeable3 etc... -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Fixed-length vectors in Haskell, Part 3: Using Fixed Enums

2005-05-11 Thread Ashley Yakeley
t; vtolist :: (BoundedEnum n) => Vec n a -> [a] > vtolist = fmap v enum > vfoldr :: (BoundedEnum n) => (a -> b -> b) -> b -> Vec n a -> b > vfoldr f b v = foldr f b (vtolist v) > vec :: a -> Vec n a > vec = const > vfromList :: [a] -> Maybe (Vec n a) > vfromList = enumFind etc. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: Fixed-length vectors in Haskell, Part 2: Using no extensions

2005-05-10 Thread Ashley Yakeley
= Vec s Vec 2 > > type Vec 4 = Vec s Vec 3 I don't understand this at all, and neither does GHC. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: MonadPlus

2005-04-30 Thread Ashley Yakeley
oo. I'd be very interested in what people feel constitutes a real MonadPlus: my own preference is Monoid, Left Zero, and Left Distribution. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] MonadPlus

2005-04-30 Thread Ashley Yakeley
I've added a bit more to <http://haskell.org/hawiki/MonadPlus>. I highly recommend people read it before they start claiming in papers that such-and-such a type "may thus be an instance of MonadPlus". -- Ashley Yakeley, Seattle WA __

[Haskell] Re: ANNOUNCE: The jhc Haskell compiler.

2005-04-26 Thread Ashley Yakeley
In article <[EMAIL PROTECTED]>, John Meacham <[EMAIL PROTECTED]> wrote: > > Very interesting! What license uses jhc? The COPYING file seems to be empty. > > It is under the GPL. Does that mean my program will be GPL if I compile it with jhc? -- As

[Haskell] HCAR?

2005-04-14 Thread Ashley Yakeley
Was there a call for HCAR contributions on this list? Did I miss it? -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Dynamic Loading?

2005-03-20 Thread Ashley Yakeley
:: FilePath -> IO Dynamic Someone else could then use your widget API to write code that provides a value of type W (or a Dynamic), and compile and link it as a widget that can then be loaded. Is this possible? -- Ashley Yakeley, Seattle

[Haskell] Re: ANNOUNCE: GHC version 6.4

2005-03-14 Thread Ashley Yakeley
raries/>, do these need to be updated? 5. Apparently a bunch of stuff is in different pacakges, such as mtl. Is there documentation about what's in what package? Perhaps Haddock should show packages or something? I'm not yet familiar enough with Cabal to know what the best way of d

[Haskell] Re: Compiling GHC on Panther using darwin ports

2005-03-08 Thread Ashley Yakeley
In article <[EMAIL PROTECTED]>, Gregory Wright <[EMAIL PROTECTED]> wrote: > I maintain the dp ghc port. Do you work with the person responsible for the Fink port (Matthias Neeracher, apparently)? I think the Fink port is behind (6.2 rather than 6.2.2). -- Ashley Yake

[Haskell] "Classic" vs. "Cunning Newtype" Derivation

2005-03-07 Thread Ashley Yakeley
takes priority. AFAICT from the H98 Report ch. 10, for Eq, Ord and Bounded this works out as the same thing, Enum doesn't apply, and Read and Show do something different. Is this correct, or are there subtle differences? -- Ashley Yakeley, Seattle WA ___

[Haskell] Re: Rebindable syntax for monads and arrows

2005-01-10 Thread Ashley Yakeley
gh you might be able to write the (>>=) function. -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell] Re: Rebindable syntax for monads and arrows

2005-01-10 Thread Ashley Yakeley
give a warning 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@h

[Haskell] Re: "Never" GADT Function?

2005-01-08 Thread Ashley Yakeley
on of `neverT': neverT BoolT = "hello" -- Ashley Yakeley, Seattle WA -- Ashley Yakeley, Seattle WA ___ Haskell mailing list Haskell@haskell.org http://www.haskell.org/mailman/listinfo/haskell

  1   2   3   4   >