Re: [Haskell-cafe] Open Source project suitable for 2-3 persons this fall?

2013-07-04 Thread Jeremy Shaw
I'm still interested in getting the scoutess project pushed the last 10% of the way to being useable: http://hub.darcs.net/alp/scoutess http://alpmestan.wordpress.com/2012/03/21/scoutess-continuous-integration-cabal-and-the-google-summer-of-code/ http://projectscoutess.blogspot.com/ The code do

Re: [Haskell-cafe] ANNOUNCE: Ajhc Haskell Compiler 0.8.0.7 Release

2013-07-08 Thread Jeremy Shaw
Any plans on supporting the popular Raspberry Pi platform? I poked at the source code a bit, but I didn't even know where to begin. - jeremy On Fri, Jul 5, 2013 at 11:01 PM, Kiwamu Okabe wrote: > We are happy to announce Ajhc 0.8.0.7. > You can program interrupt handler with Haskell language o

Re: [Haskell-cafe] "plugins" fails on a simple example

2013-09-16 Thread Jeremy Shaw
plugins probably needs to be patched[1]. I'll happily apply such a patch. - jeremy [1] or rewritten from the ground up On Mon, Sep 16, 2013 at 2:49 AM, Petr Pudlák wrote: > Hi, > > I'm playing with “plugins”, trying to evaluate a simple expression: > > import Control.Monadimport System.Eval.H

Re: [Haskell-cafe] "plugins" fails on a simple example

2013-09-17 Thread Jeremy Shaw
where to start. > > Best regards, > Petr > > Dne 09/16/2013 11:12 PM, Jeremy Shaw napsal(a): > > plugins probably needs to be patched[1]. I'll happily apply such a patch. > > - jeremy > [1] or rewritten from the ground up > > > On Mon, Sep 16, 2013 a

Re: [Haskell-cafe] "plugins" fails on a simple example

2013-10-03 Thread Jeremy Shaw
this should be fixed in plugins 1.5.4.0 which is now on hackage. Thanks! - jeremy On Mon, Sep 16, 2013 at 2:49 AM, Petr Pudlák wrote: > Hi, > > I'm playing with “plugins”, trying to evaluate a simple expression: > > import Control.Monad > import System.Eval.Haskell > > main = do > let fExpr

Re: [Haskell-cafe] Rendering TTF fonts in Haskell and OpenGL

2008-02-27 Thread Jeremy Shaw
At Fri, 22 Feb 2008 15:13:46 -, Claus Reinke wrote: > i got the impression that accessing freetype2 via ftgl > might make things slightly easier, while also offering > more options (geometry instead of texture fonts), or > did I misread? > > http://ftgl.wiki.sourceforge.net/ It appears to b

Re: [Haskell-cafe] IO () and IO [()]

2008-03-10 Thread Jeremy Shaw
At Mon, 10 Mar 2008 22:11:33 +, Paulo J. Matos wrote: > I would like to know if in fact there's any difference in practice > between (), [()], i.e. if in practice the difference matters. Well, you could do something like this: outputLines :: Int -> IO [()] outputLines i = mapM (putStrLn . sh

Re: [Haskell-cafe] Dynamic typing makes you more productive?

2008-03-18 Thread Jeremy Shaw
At Tue, 18 Mar 2008 09:41:15 -0700, Justin Bailey wrote: > > >From a recent interview[1] with the guy leading Ruby development on > .NET at Microsoft: > > "You spend less time writing software than you spend maintaining > software. Optimizing for writing software versus maintaining software > is

Re: [Haskell-cafe] Shouldn't this loop indefinitely => take (last [0..]) [0..]

2008-04-03 Thread Jeremy Shaw
Hello, Sadly, as others have pointed out, [0..] is not an infinite list in that context, so nothing too exciting is happening. You can making something almost exciting happen if you define some Peano numbers: > data P = Z | S P > inf = S Z [bunch of class instances skipped] > main = print $ ge

Re: [Haskell-cafe] one-way monads

2008-05-20 Thread Jeremy Shaw
Hello, You *can* get things out of the IO monad with: System.IO.Unsafe.unsafePerformIO :: IO a -> a but, in almost all cases you shouldn't. The name 'unsafe' is there for a reason :) The IO monad does not explicitly contain any state -- it's entire purpose is to ensure that operations which can

Re: [Haskell-cafe] relational data representation in memory using haskell?

2008-05-21 Thread Jeremy Shaw
At Thu, 22 May 2008 01:04:24 +0200, Marc Weber wrote: > Some way representing relational data which is typically stored in > databases such as Postgresql.. > > Rewriting something like Postgresql in haskell would take ages.. > So I'd be satisfied with having in memory representation only (this >

Re: happs install seems to have become very slow since upgrading cabal Re: [Haskell-cafe] test driving cabal install...

2008-05-29 Thread Jeremy Shaw
At Thu, 29 May 2008 19:19:48 -0700, Thomas Hartman wrote: > > It did finish, but I still feel like this took too long. Facebook does take several minutes to compile and consumes quite a bit of memory while doing it. If you machine does not have atleast 1GB of memory it could be thrashing due to s

Re: [Haskell-cafe] Bit streams

2008-06-18 Thread Jeremy Shaw
Malcolm Wallace wrote: > The original Binary library, circa 1998, was based on bit-streams rather > than bytes. You might be able to dig up a copy and bring it back to > life. This derivative (by Hal Daume III) works with GHC 6.8.2 (I haven't tried 6.8.3): http://hackage.haskell.org/cgi-bin/hac

Re: Haskell on ARM (was Re: [Haskell-cafe] ANN: Topkata)

2008-06-24 Thread Jeremy Shaw
n > > > should be moved to a new "Haskell on ARM" thread? > > > > I would be interested to see ghc running on Nokia n8xx or > > iRex iliad. Both of them are quite open linux based > > systems. > > Jeremy Shaw had ghc targeting the nokia last year, iirc.

Re: [Haskell-cafe] Re: Haskell on ARM (was Re: ANN: Topkata)

2008-06-26 Thread Jeremy Shaw
At Tue, 24 Jun 2008 20:43:45 -0400, Braden Shepherdson wrote: > I recently acquired the ARM-based Nokia N810 (and <3 it), powered by > Maemo. Running a uname -a on it: > I might be one to attempt this, as I know C and ARM-ish asm decently > well and have a powerful desktop to compile on. I have

Re: [Haskell-cafe] Re: Haskell on ARM (was Re: ANN: Topkata)

2008-06-27 Thread Jeremy Shaw
At Fri, 27 Jun 2008 09:57:29 +1000, Jeremy Apthorp wrote: > Next year I'll be working on a project for my undergraduate computing > course at UNSW that will involve getting GHC to target the Nintendo > DS. It'll require cross-compilation, because the DS isn't powerful > enough to actually run GHC

Re: Haskell on ARM (was Re: [Haskell-cafe] ANN: Topkata)

2008-06-29 Thread Jeremy Shaw
Also, I have successfully run hugs on the Nokia N770. j. At Sat, 28 Jun 2008 22:39:00 +0100, Malcolm Wallace wrote: > > > Just a random note. jhc works fine on ARM, > > Another semi-random note: nhc12 and nhc13 (precursors to nhc98) were > originally developed on an ARM with 2Mb of memory, w

[Haskell-cafe] Re: GHC ARM Hackathon (Re: Haskell on ARM )

2008-07-02 Thread Jeremy Shaw
At Wed, 2 Jul 2008 11:16:18 -0700, Greg Fitzgerald wrote: > Would anybody be interested in a "GHC on ARM Hackathon" in San Diego this > year? Definitely. (Conveniently, I live in La Jolla). > When is 6.10 estimated to come out? Do we really need to wait for it? According to this Release plan,

Re: [Haskell-cafe] Template Haskell and haskell-src-exts

2008-07-10 Thread Jeremy Shaw
Hello, I am not sure about the full answer to your qusetion, but I do know that template haskell support in haskell-src-exts is currently broken, but supposedly easy to fix. Not sure if that will give you the features you need or not though. From this thread: http://groups.google.com/group/haske

Re: [Haskell-cafe] [Off-topic] Loss of humour

2008-07-23 Thread Jeremy Shaw
At Wed, 23 Jul 2008 19:45:56 +0100, Andrew Coppin wrote: > > A while back I found a page somewhere containing some rather amusing IRC > quotes. Unfortunately it seems to have vanished. I can't remember where > on earth I found it, but I've scoured the Internet trying to track it > down. (In par

Re: [Haskell-cafe] Web processing

2008-08-02 Thread Jeremy Shaw
Hello, I would recommend using TagSoup: http://www-users.cs.york.ac.uk/~ndm/tagsoup/ The tutorial easy, and has good advice: http://www.cs.york.ac.uk/fp/darcs/tagsoup/tagsoup.htm I would not bother trying to use a real XML parser, because I suspect that many of the XHTML pages you want to pars

[Haskell-cafe] GHC Feature or Bug: f x = (`head` x, ())

2008-08-05 Thread Jeremy Shaw
Hello, GHC is happy to compile this code: > f x = (`head` x, ()) but Hugs does not like it, and Section 3.5 of the Haskell Report does not give any obvious indications that it is valid. Numerous people have suggested that some additional parens are required: > f x = ((`head` x), ()) Is this GH

Re: [Haskell-cafe] Stripping text of xml tags and special symbols

2008-08-05 Thread Jeremy Shaw
At Tue, 5 Aug 2008 23:21:43 +0200, Pieter Laeremans wrote: > And is there some haskell function which converts special tokens lik & -> > & and é -> &egu; ? By default, xml only has 5 predefined entities: quot, amp, apos, lt, and gt. Any additional ones are defined in the DTD. But you can *always

Re: [Haskell-cafe] helping you contribute to darcs (poll results so far)

2008-08-06 Thread Jeremy Shaw
At Wed, 6 Aug 2008 06:29:32 +0100, Eric Y. Kow wrote: > > Dear Haskellers, > > patch theory is still not defined clearly or rigorously enough for Haskellers Are the darcs developers familiar with these papers (available on citeseer): Undo Actions in Collaborative Work, Prakash & Knister 1992

Re: [Haskell-cafe] the Haskell "with" "pattern"?

2008-08-06 Thread Jeremy Shaw
At Wed, 6 Aug 2008 00:43:55 -0500, Galchin, Vasili wrote: > > [1 ] > [1.1 ] > Hello, > > 1) Is there a common assumed semantics across all of the Haskell "with" > things? withString? withData? A vague semantic is that some resource is acquired, used, and then released. > 2) If the ans

Re: [Haskell-cafe] helping you contribute to darcs (poll results so far)

2008-08-06 Thread Jeremy Shaw
At Wed, 6 Aug 2008 10:48:03 +0100, Ian Lynagh wrote: > I've just had a quick read of > http://citeseer.ist.psu.edu/prakash92undoing.html > AFAICS this only really deals with the case where there are no > conflicts, and doesn't talk about merging. AFAIK, the papers do not talking about merging

Re: [Haskell-cafe] helping you contribute to darcs (poll results so far)

2008-08-06 Thread Jeremy Shaw
At Wed, 6 Aug 2008 19:59:11 +0100, Ian Lynagh wrote: > > On Wed, Aug 06, 2008 at 11:28:58AM -0700, Jeremy Shaw wrote: > > At Wed, 6 Aug 2008 10:48:03 +0100, > > Ian Lynagh wrote: > > > > > I've just had a quick read of > > > http://citeseer.ist.

[Haskell-cafe] PRE-ANNOUNCE: cabal-debian (automatically debianize cabal packages)

2008-08-19 Thread Jeremy Shaw
At Tue, 19 Aug 2008 14:06:23 +0100, Ian Lynagh wrote: > > Any reason the manual steps here aren't automated? > > There's not much benefit from automating them (although if someone did > so, with a nice way to edit the description etc, then it would be > handy). The vast majority of the time in cr

Re: [Haskell-cafe] PRE-ANNOUNCE: cabal-debian (automatically debianize cabal packages)

2008-08-21 Thread Jeremy Shaw
At Thu, 21 Aug 2008 20:10:08 +0300, Kari Pahula wrote: > > On Tue, Aug 19, 2008 at 02:28:36PM -0700, Jeremy Shaw wrote: > > - the cdbs extension for supporting haskell (the one posted on > >debian-haskell mailing list a while ago) > > I keep the newest v

Re: [Haskell-cafe] question about uploads of code contribution

2008-08-21 Thread Jeremy Shaw
At Fri, 22 Aug 2008 00:29:40 -0500, Galchin, Vasili wrote: > 2) does the hackage database have a "reader/writer" lock to protect > readers, i.e. people downloading when I am uploading? 1. new versions must have a different version number 2. the version number is in the tarball name there

Re: [Haskell-cafe] Parsec and network data

2008-08-26 Thread Jeremy Shaw
Hello, Polyparse has some lazy parsers: http://www.cs.york.ac.uk/fp/polyparse/ Perhaps that would do the trick? j. At Tue, 26 Aug 2008 15:35:28 -0500, brian wrote: > > Hi, I've been struggling with this problem for days and I'm dying. Please > help. > > I want to use Parsec to parse NNTP da

Re: [Haskell-cafe] Comments from OCaml Hacker Brian Hurt

2009-01-16 Thread Jeremy Shaw
Hello, Personally, I would like to see the laws more explicitly listed. Some like: -- The Monoid Laws: -- -- 1. Associative: -- --x `mappend` (y `mappend` z) == (x `mappend` y) `mappend` z -- -- 2. Left Identity: -- -- mempty `mappend` y == y -- -- 3. Right identity: -- -- x `mappend` me

Re: Re[2]: [Haskell-cafe] Comments from OCaml Hacker Brian Hurt

2009-01-22 Thread Jeremy Shaw
Hello, Just some minor suggestions and comments: The description might read better as two sentences: A class for monoids with various general-purpose instances. Monoids are types with an associative binary operation that has an identity. One thing that I think is a bit unclear from tha

[Haskell-cafe] Factory methods in Haskell

2009-01-24 Thread Jeremy Shaw
Hello, I was reading about the "Factory Method Pattern" on wikipedia, and noticed that the very first example was written in Haskell. Sweet! http://en.wikipedia.org/wiki/Factory_method_pattern#Haskell Unfortunately, it looks to me like it is missing the 'factory' part. I have attempted to imple

Re: list choices (was [Haskell-cafe] ANN: filestore 0.1)

2009-01-25 Thread Jeremy Shaw
At Sun, 25 Jan 2009 10:02:28 +, Malcolm Wallace wrote: > (And on the topic of duplicate mails, it would reduce _so_ much > irritation if all the haskell-related mailing lists could set the > Reply-To header to the list, instead of defaulting to the original > poster. I already have enou

Re: [Haskell-cafe] evaluation semantics of bind

2009-02-05 Thread Jeremy Shaw
Hello, The type IO (in many Haskell implemenations) is essentially: > type IO a = RealWorld -> (a, RealWorld) And >> would be implemented like: > (>>) :: IO a -> IO b -> IO b > action1 >>= action2 = \world0 -> > let (a, world1) = action1 world0 > (b, world2) = action2 world1 > in (b

Re: [Haskell-cafe] Re: evaluation semantics of bind

2009-02-05 Thread Jeremy Shaw
At Thu, 5 Feb 2009 11:06:22 -0600, Gregg Reynolds wrote: > Are you saying that using equations to add a level of indirection > prevents optimization? I still don't see it - discarding x doesn't > change the semantics, so a good compiler /should/ do this. How is > this different from optimizing o

Re: [Haskell-cafe] Another point-free question (>>=, join, ap)

2009-02-12 Thread Jeremy Shaw
Hello, You could do: (f =<< x) =<< y ? - jeremy At Thu, 12 Feb 2009 23:36:19 +, Edsko de Vries wrote: > > Hi, > > I can desugar > > do x' <- x > f x' > > as > > x >>= \x -> f x' > > which is clearly the same as > > x >>= f > > However, now consider > > do x' <- x

Re: [Haskell-cafe] Another point-free question (>>=, join, ap)

2009-02-12 Thread Jeremy Shaw
ypes you find it only works because they are not all the same Monad m. a :: (Int -> Int) a = return 1 b :: Maybe Int b = Just 2 h :: Int -> Int -> Maybe Int h a b = return (a + b) ex5 :: Maybe Int ex5 = (h =<< a) =<< b :) j. At Thu, 12 Feb 2009 18:04:45 -0600,

Re: [Haskell-cafe] createProcess shutting file handles

2009-02-13 Thread Jeremy Shaw
Hello, As far as I can tell, createProcess is closing the handle: createProcess :: CreateProcess -> IO (Maybe Handle, Maybe Handle, Maybe Handle, ProcessHandle) createProcess cp = do r <- runGenProcess_ "runGenProcess" cp Nothing Nothing maybeCloseStd (std_in cp) maybeCloseStd (std_out

Re: [Haskell-cafe] Amazing

2009-02-14 Thread Jeremy Shaw
At Sun, 15 Feb 2009 05:37:12 +, Sebastian Sylvan wrote: > So my conclusion is that it's not just static typing, it's functional > programming in conjunction with static strong type checking. Indeed. For example, it's pretty hard to accidentally use an 'uninitialized variable' in Haskell, beca

Re: [Haskell-cafe] Purely Functional Data Structures

2009-03-07 Thread Jeremy Shaw
At Sun, 08 Mar 2009 00:13:14 +0100, G?uenther Schmidt wrote: > In SQL I would have the data indexed by several > different columns, if I use maps I'd only have one key, so if I need to > lookup data in the map by a value that is not the key the lookups will > become quite expensive. happstack-i

Re: [Haskell-cafe] I want to write a compiler

2009-03-07 Thread Jeremy Shaw
Hello, This book is pretty good IMO: http://research.microsoft.com/en-us/um/people/simonpj/papers/slpj-book-1987/ It does not cover STG, but it does cover a ton of useful stuff and is very well written. I can say from experience that the spineless-tagless-gmachine paper you referenced does cont

Re: [Haskell-cafe] Purely Functional Data Structures

2009-03-07 Thread Jeremy Shaw
At Sun, 08 Mar 2009 02:28:43 +0100, G?uenther Schmidt wrote: > > [1 ] > Hi Jeremy, > > I had used HAppS-IxSet before and was very happy with it, it offered > pretty much everything I needed. I switched (back) to SQL once I had hit > a bump in the road that I wasn't able to fix, a stack-overflo

Re: [Haskell-cafe] A bit of a shock - Memoizing functions

2009-03-27 Thread Jeremy Shaw
Hello, I've seen it done explicitly as is shown in the code below. 'f' in 'longest' is the function which is being memoized by the 'dp'. It's pretty slick, IMO. (not sure where this code came from. Also I may have broken it, but you get the idea): module Diff where import Data.Array -- * Dynam

Re: [Haskell-cafe] Unique monad?

2009-03-30 Thread Jeremy Shaw
At Mon, 30 Mar 2009 20:29:14 +0100, Andrew Coppin wrote: > > Maybe I'm just being blind here, but I don't see a monad transformer (or > even a monad) in the standard libraries for producing "unique" values. > Have I missed something? There is Data.Unique http://www.haskell.org/ghc/docs/latest/

Re: [Haskell-cafe] Unique monad?

2009-03-30 Thread Jeremy Shaw
At Mon, 30 Mar 2009 20:57:02 +0100, Lennart Augustsson wrote: > > I think Data.Unique is horrible and should be banned. > It encourages a global variable style of programming that will just > bite you in the end. Agreed. I'm ashamed I even mentioned it. - jeremy _

Re: [Haskell-cafe] Haskell EDSL to generate SQL?

2009-04-04 Thread Jeremy Shaw
At Sat, 04 Apr 2009 15:40:56 +0200, GüŸnther Schmidt wrote: > But I hope to be able to use an DSL from which I can automatically > generate SQL-Strings instead of writing the SQL statements literally. > > Has anyone else taken a similar approach? HaskellDB has an DSL for generating SQL strings.

Re: [Haskell-cafe] Re: Haskell EDSL to generate SQL?

2009-04-06 Thread Jeremy Shaw
At Sun, 05 Apr 2009 14:32:21 +0200, GüŸnther Schmidt wrote: > What is the best resource to look for more detail examples? No idea. I have not used it in years. And, last I checked, it is far from perfect. For example, I believe that field names must be unique across all tables. Also, there was a

Re: [Haskell-cafe] Adding Html formatting to formlets

2012-02-02 Thread Jeremy Shaw
Hello, Formlets is deprecated in favor of digestive functors. If you have not looked at the digestive-functors package I highly recommend that you do. It fixes a lot of little issues that formlets had -- but is basically the same thing. The (<<<) operator is a already a standard operator in Co

Re: [Haskell-cafe] Hackage 2 maintainership

2012-02-13 Thread Jeremy Shaw
Awesome! I am willing to assist with any Happstack related technical problems or questions that arise in trying to get this deployed. - jeremy On Mon, Feb 13, 2012 at 5:44 PM, Ben Gamari wrote: > Hey all, > > Those of you who follow the Haskell subreddit no doubt saw today's post > regarding

[Haskell-cafe] Compressed Data.Map for more efficient RAM usage?

2012-02-16 Thread Jeremy Shaw
Sometimes we want to store very large collection types in RAM -- such as a Data.Map or Data.IxSet. It seems like we could trade-off some speed for space savings by compressing the values in RAM. Lemmih has previously created compact-map: http://hackage.haskell.org/package/compact-map which mi

Re: [Haskell-cafe] Why so many strings in Network.URI, System.Posix and similar libraries?

2012-03-10 Thread Jeremy Shaw
It is mostly because those libraries are far older than Text and ByteString, so String was the only choice at the time. Modernizing them is good.. but would also break a lot of code. And in many core libraries, the functions are required to have String types in order to be Haskell 98 compliant. So

Re: [Haskell-cafe] Why so many strings in Network.URI, System.Posix and similar libraries?

2012-03-11 Thread Jeremy Shaw
On Sun, Mar 11, 2012 at 1:33 PM, Jason Dusek wrote: > 2012/3/11 Jeremy Shaw : > > Also, URIs are not defined in terms of octets.. but in terms > > of characters. If you write a URI down on a piece of paper -- > > what octets are you using? None.. it's some scribbles

Re: [Haskell-cafe] Why so many strings in Network.URI, System.Posix and similar libraries?

2012-03-11 Thread Jeremy Shaw
Argh. Email fail. Hopefully this time I have managed to reply-all to the list *and* keep the unicode properly intact. Sorry about any duplicates you may have received. On Sun, Mar 11, 2012 at 1:33 PM, Jason Dusek wrote: > 2012/3/11 Jeremy Shaw : > > Also, URIs are not defined in

[Haskell-cafe] GSoC project ideas for web technology

2012-03-25 Thread Jeremy Shaw
Hello, If you are looking for some ideas for a GSoC project, I have written down some web technology related projects I would like to see. So far I mostly have ideas for improvements to HSX (a templating solution) and acid-state (a pure, haskell persistent datastore). Both these technologies can

Re: [Haskell-cafe] Happstack routing + boomerang + non-ascii urls

2012-03-27 Thread Jeremy Shaw
That is concerning and mysterious. In Web.Routes.Happstack we do: >let f = runSite (domain `Text.append` approot) siteSpec (map Text.pack $ rqPaths rq) so, boomerang should be using the properly decoded rqPaths from the Happstack Request. Not sure where things are going wrong. I'll

Re: [Haskell-cafe] Happstack routing + boomerang + non-ascii urls

2012-03-27 Thread Jeremy Shaw
This should be fixed in happstack-server-6.6.5. You will need to rebuild web-routes-happstack as well to get the changes. Let me know if it works for you! Here is my test app: http://hpaste.org/66072 - jeremy On Tue, Mar 27, 2012 at 8:17 AM, Semen Trygubenko wrote: > Dear Haskell-Cafe, > > La

[Haskell-cafe] ANN: Happstack 7

2012-03-29 Thread Jeremy Shaw
We are pleased to announce the release of Happstack 7! Happstack is a fast, modern, web application framework written in Haskell. Please check out the brand new happstack.com website to read about what is new in Happstack 7, and what we are planning for Happstack 8, and what makes Happstack great

Re: [Haskell-cafe] ANN: Happstack 7

2012-03-30 Thread Jeremy Shaw
On Fri, Mar 30, 2012 at 4:36 AM, Lennart Kolmodin wrote: > Congratulations to the new release, and may I say that the homepage looks > smashing! :D > Thanks! > Before I saw happstack-wai I had a quick look at the happstack API and saw > that the Request keeps the request body as a (lazy?) Stri

[Haskell-cafe] ANN: acme-http

2012-04-01 Thread Jeremy Shaw
Hello, As we all know, the true measure of performance for a web server is the classic PONG test. And, so the Happstack team is pleased to announce the release of the new acme-http server! hackage: http://hackage.haskell.org/package/acme-http source: http://patch-tag.com/r/stepcut/acme-http

Re: [Haskell-cafe] ANN: acme-http

2012-04-01 Thread Jeremy Shaw
On Sun, Apr 1, 2012 at 12:48 PM, Michael Snoyman wrote: > That's awesome! I think you should pair this up with the /dev/null > datastore and then you'll be truly webscale! Well, acid-state does have a backend that skips writing any transaction logs to disk making it pure memory based: http://ha

[Haskell-cafe] ANN: plugins-1.5.2.1

2012-04-09 Thread Jeremy Shaw
Hello! I am pleased to announce the release of plugins-1.5.2.1: http://hackage.haskell.org/package/plugins The plugins library provides facilities to compile and dynamically load/link Haskell code into a running Haskell application. (The related, plugins-auto package adds support for file watchi

Re: [Haskell-cafe] ANN: plugins-1.5.2.1

2012-04-09 Thread Jeremy Shaw
are still valid: http://hackage.haskell.org/package/plugins-1.5.1.4 - jeremy On Mon, Apr 9, 2012 at 1:21 PM, Jeremy Shaw wrote: > Hello! > > I am pleased to announce the release of plugins-1.5.2.1: > > http://hackage.haskell.org/package/plugins > > The plugins library p

Re: [Haskell-cafe] JSON library suggestions?

2012-04-24 Thread Jeremy Shaw
Hello, I could be wrong, but I think the only real numeric type in javascript is 'Number' which is a floating point number? Which is why Aeson and others insist on converting everything to a Double or other Rational number? - jeremy On Tue, Apr 24, 2012 at 3:46 PM, Jeff Shaw wrote: > Hello, > U

Re: [Haskell-cafe] JSON library suggestions?

2012-04-24 Thread Jeremy Shaw
Hello, Have you emailed Bryan O'Sullivan and explained your problem? It sounds to me like choosing Double was just the wrong choice and is a design flaw that should be fixed in Aeson? There are far too many JSON libraries on hackage already, and what would be really useful (to me) is for the comm

Re: [Haskell-cafe] Specify compile error

2012-05-03 Thread Jeremy Shaw
This response is written in literal Haskell. > {-# LANGUAGE DataKinds, KindSignatures, GADTs #-} The key to getting the type checker involved is to put the information where the type-checker can see it -- namely, the type signature. So, let's change A so that the Safe/Unsafe information is in th

Re: [Haskell-cafe] Generalizing (++) for monoids instead of using (<>)

2012-05-04 Thread Jeremy Shaw
In the context of string-like types ++ seems quite sensible because the Monoid instances concat the strings. However, not all Monoid instances imply concatenation. A Monoid instance might provide choice. For example, we could define a parser, > module Main where > > import Data.Monoid > > newtype

Re: [Haskell-cafe] How to use Plugins package?

2012-05-18 Thread Jeremy Shaw
plugins-auto has a demo in the darcs repo: http://www.patch-tag.com/r/facundo/plugins-auto/snapshot/current/content/pretty/demo Does that work for you ? - jeremy On Wed, May 16, 2012 at 9:46 AM, Андрей Янкин wrote: > Hi, > > I'm newbie and I've got a problem. > > I'm trying to get example prog

[Haskell-cafe] ANN: reform - a type-safe form generation and validation library in the spirit of formlets and digestive-functors < 0.2

2012-05-21 Thread Jeremy Shaw
I am pleased to annouce the release of 'reform'. A full tutorial is available here: http://www.happstack.com/docs/crashcourse/Reform.html Reform is an HTML form generation and validation library. It follows in the footsteps of formlets and digestive-functors <= 0.2. In fact, much of the code in r

Re: [Haskell-cafe] ANN: reform - a type-safe form generation and validation library in the spirit of formlets and digestive-functors < 0.2

2012-05-22 Thread Jeremy Shaw
I think there's definitely room for two libraries. > > Cheers, > Jasper > > On Tue, May 22, 2012 at 2:23 AM, Felipe Almeida Lessa > wrote: >> On Mon, May 21, 2012 at 7:18 PM, Jeremy Shaw wrote: >>> I hope to do a full comparison of reform vs digestive-functors 0.3 v

[Haskell-cafe] ANN: clckwrks - a Haskell blogging and CMS framework

2012-06-12 Thread Jeremy Shaw
Hello! I am pleased to announce the launch of clckwrks.com. clckwrks (pronounced, 'clockworks') is a new Haskell-based content management (CMS) and blogging framework: http://www.clckwrks.com/ It is freely available under the BSD3 license. clckwrks is still in early alpha development. We are lo

Re: [Haskell-cafe] Problem with plugins

2012-06-20 Thread Jeremy Shaw
I really have no idea. I am the new plugins maintainer -- but so far that mostly means I am willing to apply darcs patches and uploading things to hackage. I have not had a chance to really dig into plugins. I will now make some wild guesses. 1. does it matter if you compile with -O2 vs -O0 ?

Re: [Haskell-cafe] Hackage 2 maintainership

2012-06-25 Thread Jeremy Shaw
On Wed, Jun 20, 2012 at 11:06 AM, Ben Gamari wrote: > This list is definitely a start. One of the issues that was also > realized is the size of the server's memory footprint. Unfortunately > acid-state's requirement that all data either be in memory or have no > ACID guarantees was found to be a

Re: [Haskell-cafe] acid-state audit trail

2012-10-19 Thread Jeremy Shaw
Right now acid-state always tries to restore everything up through the latest events. The long term plan is to create an acid-state tool that would allow you to rollback the event log, list and examine specific events, etc. So, it is possible in theory, and not even that hard, but no one has done

Re: [Haskell-cafe] [Security] Put haskell.org on https

2012-10-28 Thread Jeremy Shaw
On Sun, Oct 28, 2012 at 1:45 PM, Patrick Hurst wrote: > On the other hand, with PGP, any user who wants to be secure but doesn't use > GPG would have to verify the identity of whoever signed the Cabal GPG key, > and most non-Linux operating systems don't come with a list of trusted GPG > keys.

Re: [Haskell-cafe] Embedded haskell?

2013-02-20 Thread Jeremy Shaw
Another option would be to use Atom. I have successfully used it to target the arduino platform before. Running the entire OS on the embedded system seems dubious. Assuming you are using something the 9x family of transmitters -- they are slow and have very little internal memory. Plus trying to pr

Re: [Haskell-cafe] Embedded haskell?

2013-02-20 Thread Jeremy Shaw
Meyer wrote: > On Wed, Feb 20, 2013 at 4:01 PM, Jeremy Shaw wrote: >> Another option would be to use Atom. I have successfully used it to >> target the arduino platform before. Running the entire OS on the >> embedded system seems dubious. Assuming you are using something the 9x

[Haskell-cafe] monadic DSL for compile-time parser generator, not possible?

2013-03-12 Thread Jeremy Shaw
It would be pretty damn cool if you could create a data type for generically describing a monadic parser, and then use template haskell to generate a concrete parser from that data type. That would allow you to create your specification in a generic way and then target different parsers like parsec

Re: [Haskell-cafe] monadic DSL for compile-time parser generator, not possible?

2013-03-12 Thread Jeremy Shaw
On Tue, Mar 12, 2013 at 3:32 PM, Jacques Carette wrote: > On 13-03-12 04:06 PM, Jeremy Shaw wrote: >>> data ParserSpec a where >>> AnyChar :: ParserSpec Char >>> Return :: a -> ParserSpec a >>> Join:: ParserSpec (ParserSpec a) -

Re: [Haskell-cafe] monadic DSL for compile-time parser generator, not possible?

2013-03-12 Thread Jeremy Shaw
nst the Parsing class > and then use trifecta or write instances for attoparsec or parsec. With > enough inlining perhaps the overhead of the class gets optimized away? > > [1] http://hackage.haskell.org/package/parsers > > > On Tue, Mar 12, 2013 at 9:06 PM, Jeremy Shaw wrote:

[Haskell-cafe] Does GHC 7.8 make targeting bare metal ARM any easier?

2013-03-19 Thread Jeremy Shaw
There have been at least a couple projects, such as hOp and HaLVM which attempt to run GHC on the bare metal or something similar. Both these projects required a substantial set of patches against GHC to remove dependencies things like POSIX/libc. Due to the highly invasive nature, they are also h

Re: [Haskell-cafe] [Haskell] ANN: adobe-swatch-exchange-0.1.0.0

2013-04-04 Thread Jeremy Shaw
On Thu, Apr 4, 2013 at 1:46 PM, Brent Yorgey wrote: > (Redirecting follow-up to haskell-cafe) > > Very cool! I have been hoping someone will find a way to integrate > kuler.adobe.com with diagrams, and this will help a lot. =) > > https://github.com/diagrams/diagrams-lib/issues/77 Nice! One th

Re: [Haskell-cafe] Web servers: Running them multiple times in a ghci session

2013-04-11 Thread Jeremy Shaw
The problem is that ^C only kills the main thread, but does not kill any child threads that have been spawned. In happstack the Conf has an optional field where you can supply a ThreadGroup. When threads are forked they will be registered with the ThreadGroup, and when you ^C, all those threads ca

Re: [Haskell-cafe] Looking for portable Haskell or Haskell like language

2013-04-27 Thread Jeremy Shaw
Have you considered installing on older version of GHC? Such as GHC 6.10.4 or GHC 6.8.3? http://www.haskell.org/ghc/download_ghc_6_10_4 http://www.haskell.org/ghc/download_ghc_683 They won't have all the latest extensions.. but they still have more features than any other alternative. Also, once

Re: [Haskell-cafe] Hackage checking maintainership of packages

2013-05-05 Thread Jeremy Shaw
Yes -- being maintained, and have a lot of commit activity are not the same thing. There are many simple libraries which do not require much ongoing develop. They are designed to do something of limited scope, and they only need to be updated when something breaks. I have thought that a more inter

Re: [Haskell-cafe] DSL to English and back for game rule set?

2013-05-20 Thread Jeremy Shaw
This sounds like something you might use Grammatical Framework for, http://www.grammaticalframework.org/doc/tutorial/gf-tutorial.html - jeremy On Sun, May 19, 2013 at 3:27 PM, Matthew O'Connor wrote: > Hello all, > > I recognize this isn't directly a Haskell-related question, but as I'd like >

Re: [Haskell-cafe] voting sytem DSL

2013-06-05 Thread Jeremy Shaw
Hello, The closest thing I know of is, https://github.com/whatgoodisaroad/surveyor - jeremy On Wed, Jun 5, 2013 at 4:22 PM, Corentin Dupont wrote: > Hi haskellers! > I am trying to make a DSL able to describe a voting system. That DSL should > be able to describe many different voting procedur

Re: [Haskell-cafe] Why isn't hsc2hs functionality provided by ghc?

2013-06-05 Thread Jeremy Shaw
While hsc2hs is a popular FFI preprocessor, it is not the only one. There is also greencard and a few others. While hsc2hs can usually get the job done -- it's not clear that it is really the best choice. I think the Haskell FFI got to the point that it was 'just good enough' and then people lost

Re: [Haskell-cafe] ANNOUNCE: standalone-haddock-1.0

2013-06-07 Thread Jeremy Shaw
Awesome! I have been wanting to use scoutess to automatically build and upload haddock docs, but getting it to build the docs in an uploadable fashion was so painful! I had crazy code that was rewriting the package database and stuff. This seems like exactly what I need! - jeremy On Fri, Jun 7,

Re: [Haskell-cafe] Automating Hackage accounts

2013-06-13 Thread Jeremy Shaw
No idea, But if not, it should be trivial to add support. The two main issues would be getting an SSL certificate (if one does not already exist) and then making sure that the links do not hardcode the schema. So // hackage.haskell.org/foo instead of http://hackage.haskell.org/. Then the site can

Re: [Haskell-cafe] How can I use MACID in my existing application?

2010-11-04 Thread Jeremy Shaw
Hello, I added a brief section to the happstack crash course on using MACID: http://www.happstack.com/docs/crashcourse/HappstackState.html That should hopefully get you started. The example uses happstack state with happstack server. But there is really no connection between the two. Hope this

Re: [Haskell-cafe] How can I use MACID in my existing application?

2010-11-07 Thread Jeremy Shaw
this match with the Update type in Happstack? Thanks a lot for your help. Corentin On Fri, Nov 5, 2010 at 3:50 AM, Jeremy Shaw wrote: Hello, I added a brief section to the happstack crash course on using MACID: http://www.happstack.com/docs/crashcourse/HappstackState.html That should hopefu

[Haskell-cafe] Re: change in overlapping instance behavior between GHC 6.12 and GHC 7 causes compilation failure

2010-11-08 Thread Jeremy Shaw
Hello, I have narrowed this down further to a single file. And created a trac bug for it: http://hackage.haskell.org/trac/ghc/ticket/4485 This is (the only thing?) holding up HSP and happstack moving to GHC 7. - jeremy On Tue, Nov 2, 2010 at 5:36 PM, Jeremy Shaw wrote: > Hello, > >

Re: [Haskell-cafe] ActionScript Byte Code backend ?

2010-11-09 Thread Jeremy Shaw
Hello, I wrote the old backend. I have not (and will not) have the time to update to the newer SWF format. Unless things have changed, the format is well documented -- so you don't have to reverse engineer it if you want to make your own attempt. That said, if you are trying to generate a

Re: [Haskell-cafe] Reply-To: Header in Mailinglists (was: About "Fun with type functions" example)

2010-11-19 Thread Jeremy Shaw
Reply-to munging has come up many times on this list (and others). See this page for information on why many people do not like Reply-to munging: http://marc.merlins.org/netrants/listreplyto.html - jeremy On Thu, Nov 18, 2010 at 9:55 PM, Bastian Erdnüß wrote: > Hi there, > > I just put an answ

Re: [Haskell-cafe] handling multiple versions of a data structure

2010-12-16 Thread Jeremy Shaw
Hello, You should use happstack-data for this (you do not need the other happstack components to use happstack-data)*. It was created to solve this exact problem. happstack-data builds on type of the 'binary' library and adds versioned data types and automatic version migration. You ca

Re: [Haskell-cafe] What is NoPush module?

2010-12-16 Thread Jeremy Shaw
oops. I got distracted when recording a patch and accidently recorded some extra stuff that was not ready yet. I pushed another patch which rolls back the premature changes. Sorry about that :( - jeremy On Dec 16, 2010, at 8:02 PM, Magicloud Magiclouds wrote: Hi, When I compiling happs

Re: [Haskell-cafe] handling multiple versions of a data structure

2010-12-16 Thread Jeremy Shaw
On Dec 16, 2010, at 4:48 PM, Daniel Peebles wrote: Have you considered moving these packages that are unrelated to web development into a separate namespace? I know that I never considered looking under the happstack namespace simply because I never do webapps. Yes. I have been wanting to

Re: [Haskell-cafe] handling multiple versions of a data structure

2010-12-18 Thread Jeremy Shaw
Nice. Do you think there is any reason we would not be able to / want to use it with happstack ? I would love happstack-data to 'go away' and just use some library from hackage which does the same thing. - jeremy On Dec 17, 2010, at 3:57 AM, Erik Hesselink wrote: I've recently been playi

<    1   2   3   4   >