Re: [Haskell-cafe] video for linux two (v4l2) bindings

2011-07-03 Thread Christopher Done
Sounds awesome! I was recently thinking I wanted a v4l-binding. In the past I've patched vgrabbj so that I could pipe it and use it from Haskell, but wanted a direct binding. I just had a quick try with cabal-install and got the below. I'm not sure where linux/posix_types is supposed to come

Re: [Haskell-cafe] Haskell and Databases

2011-07-01 Thread Christopher Done
On 1 July 2011 20:51, Yves P limestr...@gmail.com wrote: There is something that bothers me with that text, I can't get to grasp what it is... It's bigger than Godzilla? ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org

Re: [Haskell-cafe] [ANN] mysql-simple - your go-to package for talking to MySQL

2011-06-21 Thread Christopher Done
On 21 June 2011 13:45, David Virebayre dav.vire+hask...@gmail.com wrote: The very first example didn't work for me : {-# LANGUAGE OverloadedStrings #-} import Database.MySQL.Simple hello = do conn - connect defaultConnectInfo query conn select 2 + 2 Yeah,

Re: [Haskell-cafe] [web-devel] [ANN] mysql-simple - your go-to package for talking to MySQL

2011-06-21 Thread Christopher Done
On 21 June 2011 15:28, Johan Tibell johan.tib...@gmail.com wrote: On Tue, Jun 21, 2011 at 2:34 PM, cheater cheater cheate...@gmail.com wrote: Is there such a standard for haskell? Not at the moment. I believe Bryan has at least talked with one other author (of a PostreSQL binding) about

Re: [Haskell-cafe] [ANN] mysql-simple - your go-to package for talking to MySQL

2011-06-21 Thread Christopher Done
On 21 June 2011 16:47, David Virebayre dav.vire+hask...@gmail.com wrote: For example, how to write a function that returns the columns of a table using show columns ? type Champ = (String,String,String,String,String,String) getColumns :: Connection - String - IO [Champ] getColumns conn table

Re: [Haskell-cafe] [ANN] mysql-simple - your go-to package for talking to MySQL

2011-06-21 Thread Christopher Done
On 21 June 2011 16:54, Christopher Done chrisd...@googlemail.com wrote: query conn SHOW COLUMNS FROM ? (Only mytable) (With OverloadedStrings enabled.) Woops, that would need a type annotation. (Only (mytable :: Entity)) ___ Haskell-Cafe mailing

Re: [Haskell-cafe] Proposal: remove Stability from haddock documentation on hackage

2011-06-07 Thread Christopher Done
On 7 June 2011 15:05, James Cook mo...@deepbondi.net wrote: It's good, in my opinion, to be able to state succinctly in a standardized way that, although it does something now, what the code does and how it does it are probably going to change in the future. I think no one really updates

Re: [Haskell-cafe] haskellwiki slow/unresponsive

2011-06-03 Thread Christopher Done
On 3 June 2011 22:17, Eric Rasmussen ericrasmus...@gmail.com wrote: This is a bit of a tangent, but has anyone developed wiki software in Haskell? They have[1][2], but there's always room for more. [1]: http://hackage.haskell.org/package/gitit [2]: http://hackage.haskell.org/package/Flippi

Re: [Haskell-cafe] Efficient object identity (aka symbols as data)

2011-05-26 Thread Christopher Done
On 26 May 2011 10:45, Jacek Generowicz jacek.generow...@cern.ch wrote: What is the Haskell approach to efficient comparison and lookup of objects by their identity? Often you just provide your own and implement Eq. I should be able to run the program on data that becomes available at run

Re: [Haskell-cafe] Strange Type Error

2011-05-26 Thread Christopher Done
The problem is the monomorphism restriction: http://www.haskell.org/haskellwiki/Monomorphism_restriction http://www.haskell.org/ghc/docs/7.0.2/html/users_guide/monomorphism.html http://stackoverflow.com/questions/tagged/monomorphism-restriction

Re: [Haskell-cafe] GOA broken with recent lambdabots

2011-05-24 Thread Christopher Done
On 24 May 2011 10:05, Jacek Generowicz jacek.generow...@cern.ch wrote: GOA is broken with recent lambdabots, according to    http://hackage.haskell.org/package/goa-3.0.2 It certainly fails to compile for me (like this http://hpaste.org/46994/goa_build_failure ) I can fix it tonight. Not a

Re: [Haskell-cafe] GOA broken with recent lambdabots

2011-05-24 Thread Christopher Done
On 24 May 2011 10:26, Jacek Generowicz jacek.generow...@cern.ch wrote: I can fix it tonight. Not a big deal. Great. Thanks. Fixed: https://github.com/chrisdone/goa/issues/1 http://hackage.haskell.org/package/goa cabal update cabal install goa ___

Re: [Haskell-cafe] Server hosting

2011-05-06 Thread Christopher Done
On 6 May 2011 20:07, Andrew Coppin andrewcop...@btinternet.com wrote: OK, so strictly this is unrelated to Haskell as such. However, there's enough people doing webby stuff with Haskell that some of you must have wanted to run your code on a real, Internet-accessible web server. So does

Re: [Haskell-cafe] Server hosting

2011-05-06 Thread Christopher Done
On 6 May 2011 20:18, Steffen Schuldenzucker sschuldenzuc...@uni-bonn.dewrote: I don't really expect this to work, but... ?php $argsstr = ... $ok = 0 passthru( './my_real_cgi '.$argsstr, $ok ); exit( $ok ); ? I actually got something like that to work on a shared host before, I used

Re: [Haskell-cafe] Reformatter for Show

2011-05-02 Thread Christopher Done
On 2 May 2011 22:01, Alexey Khudyakov alexey.sklad...@gmail.com wrote: Hello everyone! Haskell have nice automatically derivable Show type class. It's quite useful for debugging with one exception. String representation of even moderately large value is completely unreadable (example below).

Re: [Haskell] Possible Hackathon at MSR Cambridge this summer

2011-04-27 Thread Christopher Done
On 11 April 2011 10:59, Simon Marlow marlo...@gmail.com wrote: please vote today or tomorrow (Tuesday), I'll close the poll on Wednesday. If you don't have a preference, there's no need to vote. Definitely interested. Is the 12th the confirmed date, or otherwise will you update this thread?

Re: [Haskell-cafe] How to keep cabal and ghci package versions in sync?

2011-04-24 Thread Christopher Done
On 24 April 2011 22:27, Rogan Creswick cresw...@gmail.com wrote: On Sun, Apr 24, 2011 at 11:13 AM, Gracjan Polak gracjanpo...@gmail.com wrote: I have a project with a .cabal file listing package dependencies using the usual version constraints ==X.Y.* Z.W or =K.J syntax. Standard route

[Haskell-cafe] There is no null; Maybe/Option types

2011-04-22 Thread Christopher Done
Hi Cédric, I saw your post on Maybe types wondering what the point of it is and why anyone would want it. I thought I'd reply by email as I don't want to infringe on your freedom of expression. If you find that I'm saying things you already know, please scroll down to the bottom, which addresses

Re: [Haskell-cafe] There is no null; Maybe/Option types

2011-04-22 Thread Christopher Done
On 22 April 2011 21:26, Henning Thielemann lemm...@henning-thielemann.dewrote: In idiomatic Haskell you would write case userList of Nothing - Nothing Just plainUserList = let user = findUser bob plainUserList ... since (userList /= Nothing) requires an Eq instance without

Re: [Haskell-cafe] Emscripten: compiling LLVM to JavaScript

2011-04-11 Thread Christopher Done
On 11 April 2011 14:54, Sönke Hahn sh...@cs.tu-berlin.de wrote: I haven't tried the tool myself, but it seems interesting to the Haskell efforts to compile to JavaScript: http://syntensity.blogspot.com/2011/04/emscripten-10.html Good grief, that sounds incredibly awesome. GHC → LLVM → JS.

Re: [Haskell-cafe] parsec - source position information

2011-04-07 Thread Christopher Done
On 7 April 2011 17:22, Ozgur Akgun ozgurak...@gmail.com wrote: Is there a way to get source position[1] information from parsec while defining a parser? It surely knows about source positions, as they are used while reporting a parsing error.

Re: [Haskell-cafe] ANN: Google Summer of Code student application period opens today

2011-04-05 Thread Christopher Done
On 5 April 2011 15:17, Marco Túlio Gontijo e Silva mar...@marcot.eti.brwrote: I plan to apply to the Google Summer of Code, to work on the parallelization of Cabal Install. As stated in some comments, this project may be too small for three months, so I included some other things in my

Re: [Haskell-cafe] ANN: Google Summer of Code student application period opens today

2011-04-05 Thread Christopher Done
On 5 April 2011 15:33, Vo Minh Thu not...@gmail.com wrote: I'm sure everyone is eager to have a parallel GHC and parallel Cabal. I am. Waiting for 67 modules to build in order every time I change my types file is not fun. You should parallelize yourself instead; while one thread is

Re: [Haskell-cafe] Using _ on the RHS of an equation?

2011-04-05 Thread Christopher Done
On 5 April 2011 18:00, James Cook mo...@deepbondi.net wrote: It's quite hacky, but this can be done with CPP and quasiquoting (incidentally, it would be _REALLY_ nice if 'undefined' and 'error' had similar source-location-dependent error messages by default):

Re: [Haskell-cafe] working off a Yesod example file, need help lifting values from one monad into another. (and probably other things too).

2011-03-29 Thread Christopher Done
On 29 March 2011 05:00, Michael Litchard mich...@schmong.org wrote: I just noticed those. I think that came from hpaste. The first mail was a cut and paste from a post I made there. When I went to look at your reply, I had the very same question as you. IIRC IE users have this problem, it

Re: [Haskell-cafe] bug in Prelude.words?

2011-03-28 Thread Christopher Done
On 28 March 2011 17:55, malcolm.wallace malcolm.wall...@me.com wrote: Does anyone else think it odd that Prelude.words will break a string at a non-breaking space? Prelude words abc def\xA0ghi [abc,def,ghi] I think it's predictable, isSpace (which words is based on) is based on

Re: [Haskell-cafe] Mime / Mail library

2011-03-20 Thread Christopher Done
On 20 March 2011 15:05, Pieter Laeremans pie...@laeremans.org wrote: Hi all, The MIME package that can be found on hackage, uses String as input. Would i be considered better if there would be a version based on Text, or ByteString ? I think the solution to this problem is a generic

Re: [Haskell-cafe] Parallel Haskell stories

2011-03-09 Thread Christopher Done
On 9 March 2011 17:18, Simon Peyton-Jones simo...@microsoft.com wrote: I can't say a lot about any one example, obviously, but what would be great would be - an idea of how Haskell helped (esp if you have a head to head comparison) - code snippets that illustrate how lovely it

Re: [Haskell-cafe] ANN: theoremquest-0.0.0

2011-02-28 Thread Christopher Done
On 28 February 2011 17:59, Jesper Louis Andersen jesper.louis.ander...@gmail.com wrote: Many normal puzzle games fit into the NP-complete class as well, so it would look as if human beings like the challenge of trying to solve hard problems. Theorem proving is simply yet another beast in the

Re: [Haskell-cafe] How large is the Haskell community ?

2011-02-12 Thread Christopher Done
On 12 February 2011 21:18, Aaron Gray aaronngray.li...@gmail.com wrote: I was wondering if anyone had an idea or estimate as to how large the Haskell community is ? http://blog.johantibell.com/2010/08/results-from-state-of-haskell-2010.html

Re: [Haskell-cafe] Clear screen in ghci in haskell-mode in emacs?

2011-01-30 Thread Christopher Done
On Sun, 2011-01-30 at 12:04 -0500, JETkoten wrote: I'm looking for a way to clear the screen in ghci within emacs. In Emacs: M-x erase-buffer ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org

Re: [Haskell-cafe] Formatting function types

2010-12-30 Thread Christopher Done
On 30 December 2010 15:44, Antoine Latter aslat...@gmail.com wrote: On Thu, Dec 30, 2010 at 8:33 AM, Lauri Alanko l...@iki.fi wrote: Even nowadays, Haddock deliberately generates the following layout for long function types: openTempFile :: FilePath - String - IO

Re: [Haskell-cafe] Why is Haskell flagging this?

2010-12-18 Thread Christopher Done
On 17 December 2010 18:04, michael rice nowg...@yahoo.com wrote: === f :: [Int] - IO [Int] f lst = do return lst main = do let lst = f [1,2,3,4,5] fmap (+1) lst The problem is that you are applying fmap to a type IO a. fmap (+1) (return [1,2,3]) But to achieve

Re: [Haskell-cafe] (Read r) = IO (Maybe r)

2010-12-17 Thread Christopher Done
On 17 December 2010 13:59, Jacek Generowicz jacek.generow...@cern.chwrote: What are some interesting, idiomatic ways of writing something similar to the following λ :m + Safe λ let getValidatedInteger = getLine = maybe (do putStrLn That doesn't seem to be an integer. Try again.;

Re: [Haskell-cafe] the beginning of the end

2010-12-05 Thread Christopher Done
On 5 December 2010 18:34, Daniel Peebles pumpkin...@gmail.com wrote: Oh yeah, the 2.0 stuff that snobby techies love to hate :) hrrmpf back in my day we programmed in binary using a magnetized needle on the exposed tape! I don't need any of this newfangled bull. I kid! But I am curious

[Haskell-cafe] Who's in charge of the new Haskell.org server?

2010-12-01 Thread Christopher Done
If someone will allow me to send them an extension for WikiMedia I will write one. It shouldn't be complex at all, so code review will be trivial. Please let me know! I'm sure other people here are interested to know who to go to to get things like this done. It would be cool to write an

Re: [Haskell-cafe] Manatee Video.

2010-11-28 Thread Christopher Done
In other words, just remove the owl city track. On 28 November 2010 18:21, Florian Weimer f...@deneb.enyo.de wrote: * Andy Stewart: Many people ask What's Manatee? A video worth a thousand words : here is video (select 720p HD) http://www.youtube.com/watch?v=weS6zys3U8k Ahem: |

Re: [Haskell-cafe] Load testing

2010-11-28 Thread Christopher Done
Apache benchmark - ab http://httpd.apache.org/docs/2.0/programs/ab.html On 29 November 2010 02:23, Tony Morris tonymor...@gmail.com wrote: Does there exist a package for convenient load-testing against a website? e.g. making lots of HTTP requests against a server, including timing, and

Re: [Haskell-cafe] Can't install Leksah

2010-11-27 Thread Christopher Done
On 27 November 2010 10:41, Paul Johnson p...@cogito.org.uk wrote: I installed gtk2hs-buildtools as per the Leksah page, and then tried to install Leksah itself. I got: [r...@eiffel download]# cabal install leksah Resolving dependencies... cabal: cannot configure leksah-server-0.8.0.8. It

Re: [Haskell-cafe] Re: Eq instance for Chan

2010-11-25 Thread Christopher Done
On 25 November 2010 13:47, Mitar mmi...@gmail.com wrote: Hi! On Thu, Nov 25, 2010 at 1:05 PM, Simon Marlow marlo...@gmail.com wrote: It's just an oversight. Send us a patch, or make a ticket for it? Done: http://hackage.haskell.org/trac/ghc/ticket/4526 Free software in action!

Re: [Haskell-cafe] GHC Out of memory

2010-11-23 Thread Christopher Done
What version of GHC/qtHaskell? On 23 November 2010 08:21, John Smith volderm...@hotmail.com wrote: I get an out-of-memory error about two thirds of the way through building qtHaskell. If I start again, the remaining modules are compiled successfully, although GHC's memory usage creeps up to

Re: [Haskell-cafe] Wondering if this could be done.

2010-11-21 Thread Christopher Done
Check out the awesome prelude, used to define ESDLs: http://tom.lokhorst.eu/2010/02/awesomeprelude-presentation-video On 22 November 2010 07:48, Magicloud Magiclouds magicloud.magiclo...@gmail.com wrote: Hi, For example, I have a data A defined. Then I want to add (+) and (-) operators to

Re: [Haskell-cafe] Re: Add haskell-src as an official machine-readable component of the Haskell standard

2010-11-16 Thread Christopher Done
On 16 November 2010 16:24, Niklas Broberg niklas.brob...@gmail.com wrote: (Moving to Café) (Examples of controversies possible in haskell-src: we have the Hs prefix on constructors everywhere, we can't provide fixity information (and the haskell-src-exts implementation of this is

Re: [Haskell-cafe] Catching up on Time and Directory

2010-11-16 Thread Christopher Done
On 16 November 2010 11:30, Jon Fairbairn jon.fairba...@cl.cam.ac.uk wrote: I'm probably terribly out of date with this, so I wonder if anyone can save me the bother of working out what the /preferred/ libraries are for (a) determining the last-modified-time of a file or directory and (b)

Re: [Haskell-cafe] RegEx versus (Parsec, TagSoup, others...)

2010-11-15 Thread Christopher Done
On 13 November 2010 16:46, Neil Mitchell ndmitch...@gmail.com wrote: I've been working on a project that requires me to do screen scraping. If you are screen scraping HTML I think tagsoup is a very good choice. The use of tagsoup means that you have a real HTML 5 compliant parser underneath,

Re: [Haskell-cafe] http://www.haskell.org/ is down !

2010-11-15 Thread Christopher Done
On 13 November 2010 20:16, Pasqualino Titto Assini tittoass...@gmail.com wrote: is haskell.org being updated or It's back up now. As far as I'm aware, it is being updated. But I'm not sure on the progress of it and whether the server transfer is related. If so, I am ready to fight ! Lambda

Re: [Haskell-cafe] Opportunity for Haskell porting to java at RD labs in Bay Area, CA

2010-11-10 Thread Christopher Done
On 10 November 2010 21:42, Padma pa...@sraoss.com wrote: We are looking for a entry level Haskell programmer who has experience in porting from Haskell to java. That sounds like quite a begrudging job. Also kind of sad. It sounds like someone wrote a project in Haskell, left and now management

Re: [Haskell-cafe] non-hackage cabal repos? unpacking non-repo package tarballs?

2010-11-02 Thread Christopher Done
On 2 November 2010 19:02, Claus Reinke claus.rei...@talk21.com wrote: 1. The simplest approach would be if cabal could expose its internal 'unpackPackage' as a command, so that   author: cabal sdist   user: cabal unpackPackage Example.tar.gz [...] 2. Failing that, I remembered that cabal

Re: [Haskell-cafe] trying to use Tag Soup - fromAttrib

2010-11-02 Thread Christopher Done
On 2 November 2010 22:40, Michael Litchard mich...@schmong.org wrote: fromAttrib :: (Show str, Eq str, StringLike str) = str - Tag str - str seems to say fromAttrib takes two parameters (I know it doesn't literally take two), one str (with the constraints in parenthesis to the left) and one

Re: [Haskell-cafe] template haskell for typeclass synonyms

2010-11-01 Thread Christopher Done
On 1 November 2010 17:53, Paolino paolo.verone...@gmail.com wrote: I'd like to have a template haskell function that take some constraints and a class name and write an empty class from those and relative empty instance to simulate typeclass synonyms. As I've never written TH and couldn't

Re: [Haskell-cafe] ANN: network-2.2.3, merger with network-bytestring

2010-11-01 Thread Christopher Done
On 1 November 2010 09:55, Neil Davies semanticphilosop...@gmail.com wrote: How accurate do you need this control of throughput? To get really accurate rates we had to write our own specialist rate regulated thread library which accounts for any scheduling delay and can even spin if you want low

Re: [Haskell-cafe] ANN: network-2.2.3, merger with network-bytestring

2010-10-31 Thread Christopher Done
On 31 October 2010 16:14, Johan Tibell johan.tib...@gmail.com wrote: This version marks the end of the network-bytestring package, which has now been merged into the network package. This means that efficient and correct networking using ByteStrings is available as part of the standard network

Re: [Haskell-cafe] ANN: network-2.2.3, merger with network-bytestring

2010-10-31 Thread Christopher Done
(Er, that should be (speed/4), not (speed*4). x4 the block size should be x4 the delay.) ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] How can we make Haskell-Cafe scale? (was: Re: Edit Hackage)

2010-10-31 Thread Christopher Done
On 31 October 2010 04:08, Sterling Clover gersh...@gmail.com wrote: How can we make Haskell-Cafe scale? There's been some grumbling about users migrating from -cafe to Reddit and Stack Overflow in particular. First, as Don has pointed out, the fact is that people are moving away, and that's

Re: [Haskell-cafe] State nested structures

2010-10-29 Thread Christopher Done
2010/10/29 Dupont Corentin corentin.dup...@gmail.com: Of course in module A I'm calling some functions of module B. I'd like to know if it's possible, in a function of type SA, to call a function of type SB, without actually executing the State SB. I just wanna tell him Hey look, you can

Re: [Haskell-cafe] Red links in the new haskell theme

2010-10-28 Thread Christopher Done
On 28 October 2010 03:41, Victor Oliveira rhapso...@gmail.com wrote: Hi Cafe, I really liked the new colors of haskell theme, but... Is really red a good color for links?  At least for me, red links looks like broken or already visited ones. And the worst is hackage docs. It is really eye

Re: [Haskell-cafe] Current thinking on CompositionAsDot issue in haskell prime?

2010-10-28 Thread Christopher Done
On 28 October 2010 10:15, Alexander Kjeldaas alexander.kjeld...@gmail.com wrote: I think I recognize this issue from common lisp.  Basically the code becomes verbose because accessor functions usually need to redundantly encode the name of the module or struct in its name.  The alternative is

Re: [Haskell-cafe] Re: Red links in the new haskell theme

2010-10-28 Thread Christopher Done
On 28 October 2010 16:48, Kevin Jardine kevinjard...@gmail.com wrote: To be fair to the Haddock designer, red links are common these days. Here's two examples (among many): http://www.bbc.co.uk/ http://www.slate.com/ In the second case the site uses blue, black *and* red links to

Re: [Haskell-cafe] Does it deserve to be a hackage package?

2010-10-27 Thread Christopher Done
On 27 October 2010 10:13, Dmitry V'yal akam...@gmail.com wrote: While ago I had a question about opening the url in the default browser from haskell program. I didn't get any immediate answers so I wrote my own solution. On Linux it uses xdg-open and on Windows - ShellExecute Api. Does it

Re: [Haskell-cafe] If Python now has a good email library; how challenging is it to call Python from Haskell?

2010-10-27 Thread Christopher Done
On 27 October 2010 19:46, Thomas DuBuisson thomas.dubuis...@gmail.com wrote: How does python having an e-mail library change the situation with calling Python from Haskell? He's commenting, presumably, on the apparently disparate nature of Haskell email libraries and the fortuitousness

Re: [Haskell-cafe] Need programming advice for Network Protocol Parsing

2010-10-27 Thread Christopher Done
2010/10/27 Günther Schmidt gue.schm...@web.de: My question is in regard which parser to use for the servers responses. I'm quite familiar with parsec (2.x) but I'm not sure if it's the right choice for this. The code would necessarily constantly be switching between checking for input,

Re: [Haskell-cafe] Map constructor in a DSL

2010-10-26 Thread Christopher Done
On 26 October 2010 18:07, Dupont Corentin corentin.dup...@gmail.com wrote: But how can I write the evaluator for Map? Where do values for PlayerNumber come from? Unless I'm mistaken, the only thing that Map can be used with is Obs [PlayerNumber], a list of values PlayerNumber which we have no

Re: [Haskell-cafe] Haskellers design

2010-10-21 Thread Christopher Done
On 21 October 2010 19:54, Michael Snoyman mich...@snoyman.com wrote: Please note that questions 1 and 2 may have different answers. Keep in mind when evaluating these themes, especially the first, that it is *not* in finalized form, just an basic idea of what could be. A third option that I

Re: [Haskell-cafe] [ANNAUNCE] ghcjs-0.1.0 Haskell to Javascript compiler

2010-10-21 Thread Christopher Done
On 21 October 2010 01:01, Victor Nazarov asviraspossi...@gmail.com wrote: I've been working on this for some month and I think now I'm ready to share the results. http://github.com/sviperll/ghcjs This is very cool, as a web developer I have a lot of interest in this. All GHC's extensions is a

Re: [Haskell-cafe] Are newtypes optimised and how much?

2010-10-20 Thread Christopher Done
On 20 October 2010 13:09, Simon Peyton-Jones simo...@microsoft.com wrote: Yes, you can freely use Foo/unFoo.  There's no runtime penalty.  (In the jargon of GHC's intermediate language, Foo and unFoo translate to *type-safe casts*, which generate no executable code. That includes the

Re: [Haskell-cafe] HaskellDB/ODBC/MySQL issue

2010-10-19 Thread Christopher Done
On 19 October 2010 18:51, Neil Davies semanticphilosop...@gmail.com wrote: Hi I can't seem to get the combination of HaskellDB/ODBC/MySQL to even get off the ground, example: import OmlqDBConnectData (connect'options) import Database.HaskellDB import Database.HaskellDB.HDBC.ODBC

[Haskell-cafe] Are newtypes optimised and how much?

2010-10-19 Thread Christopher Done
So I have the following nice things: {-# LANGUAGE GeneralizedNewtypeDeriving, OverloadedStrings #-} import Data.String newtype Foo = Foo { unFoo :: String } deriving (IsString) x :: Foo x = Hello, World! newtype Bar = Bar { unBar :: Integer } deriving (Eq,Show,Num,Integral,Real,Enum,Ord) y

Re: [Haskell-cafe] Happstack, RqData: (How) can I extract multiple data from form?

2010-10-18 Thread Christopher Done
2010/10/18 Никитин Лев leon.v.niki...@pravmail.ru: Hello. (How) can I query multiple data from form? One of requirement is possibility to add additionally key and tags for this key (via button, using javascript). Can I groupe such pairs using html? The following looks like something

Re: [Haskell-cafe] Text.Regex Segfault

2010-10-17 Thread Christopher Done
On 17 October 2010 04:45, Duane Johnson duane.john...@gmail.com wrote: I bumped into a segmentation fault in the regex library today and thought I'd warn others in case similar behavior is observed: Prelude :m Text.Regex Prelude Text.Regex map read (splitRegex (mkRegex \\|) 0|1|2|4) :: [Int]

Re: [Haskell-cafe] A rant against the blurb on the Haskell front page

2010-10-16 Thread Christopher Done
On 16 October 2010 05:52, Ben Franksen ben.frank...@online.de wrote: what marketing idiot has written this inclonclusive mumble-jumble of buzz-words? [...] How can anyone write such a nonsense? Haskell is not an open source product! [...] I am ashamed that it appears on the front page of

Re: [Haskell-cafe] Ambiguous type variable

2010-10-15 Thread Christopher Done
On 16 October 2010 00:47, Jacek Generowicz jacek.generow...@cern.ch wrote: -- why does show 2 compile, while view 2 gives an -- 'Ambiguous type variable' error fine                  = view (2::Int) noProblem             = show 2 ambiguousTypeVariable = view 2 Don't integral literals default

Re: [Haskell-cafe] ANNOUNCE: tagged-list v1.0

2010-10-14 Thread Christopher Done
Here's the link: http://hackage.haskell.org/package/tagged-list ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] The Haskell theme

2010-10-13 Thread Christopher Done
On 13 October 2010 05:49, Mark Lentczner ma...@glyphic.com wrote: I spent some time beforehand looking at what other successful language communities do w.r.t. visual design. I found that none of the communities had a single theme; most had two or three. but these themes were visually

Re: [Haskell-cafe] ghci - always show types

2010-10-13 Thread Christopher Done
On 13 October 2010 17:55, Ozgur Akgun ozgurak...@gmail.com wrote: Just a quick question. Either I am hallucinating or there was a way of saying ghci to always show types. It was working as if you typed :t it after every line of input. Sorry, I searched but couldn't find the option via google.

[Haskell-cafe] The Haskell theme

2010-10-12 Thread Christopher Done
To kick off discussion about Haskell's general theme, as discussed recently, here's some random ideas. Going with the original colours of the nominated Haskell logo, and kinda what's been done here: http://new-www.haskell.org/haskellwiki/Haskell http://img840.imageshack.us/img840/3577/ideasv.png

Re: [Haskell-cafe] Re: [Haskelldb-users] ANNOUNCE: HaskellDB 2.0: Scrap your SQL strings

2010-10-11 Thread Christopher Done
On 11 October 2010 16:45, Justin Bailey jgbai...@gmail.com wrote: No immediate plans but thanks for pointing that out - I hadn't seen it yet. Similar functionality exists in the haskelldb-th package, without the special type operators. Hey that's cool, I hadn't seen that. This'll reduce my

[Haskell-cafe] Make your Darcs repositories hashed?

2010-10-09 Thread Christopher Done
Every Darcs repository I've pulled this year has always showed me this message: *** Fetching a hashed repository would be faster. Perhaps you could persuade the maintainer to run darcs optimize --upgrade with darcs 2.4.0

Re: [Haskell-cafe] ANNOUNCE: tls, native TLS/SSL protocol implementation

2010-10-08 Thread Christopher Done
On 8 October 2010 07:44, C K Kashyap ckkash...@gmail.com wrote: Does native mean Haskell only - without FFI? I think not Haskell would be piping to a separate non-Haskell process or calling by FFI to another language to do the interesting work. Thus native is not using these for the interesting

Re: [Haskell-cafe] ANNOUNCE: tls, native TLS/SSL protocolimplementation

2010-10-08 Thread Christopher Done
On 8 October 2010 13:54, Sittampalam, Ganesh ganesh.sittampa...@credit-suisse.com wrote: Vincent Hanquez wrote: On Fri, Oct 08, 2010 at 11:14:01AM +0530, C K Kashyap wrote: Does native mean Haskell only - without FFI? Native means the implementation is in haskell, and the library is not

Re: [Haskell-cafe] Re: Haskell web development entries on the Wiki

2010-10-06 Thread Christopher Done
On 6 October 2010 12:47, Henning Thielemann thunderb...@henning-thielemann.de wrote: I for instance use http-shed and mohws all the time. They do what they shall do for me. I maintain mohws Please move the ones you use and maintain to the active list!

Re: [Haskell-cafe] Re: Haskell web development entries on the Wiki

2010-10-06 Thread Christopher Done
On 6 October 2010 14:16, Henning Thielemann lemm...@henning-thielemann.de wrote:  I'm generally not glad that some people rearrange existing structure and expect that all of the affected authors follow. It's already tedious to catch up with the yearly changes in GHC's package and other base

Re: [Haskell-cafe] Re: Haskell web development entries on the Wiki

2010-10-06 Thread Christopher Done
On 6 October 2010 16:33, Henning Thielemann lemm...@henning-thielemann.de wrote: How about mailing to the package maintainers in order to inform they, that the Web application list on the Wiki has changed? I'm afraid not all authors follow haskell-cafe or haskell-web. I could send out a bulk

Re: [Haskell-cafe] Re: Lambda-case / lambda-if

2010-10-06 Thread Christopher Done
On 6 October 2010 11:39, Simon Marlow marlo...@gmail.com wrote:   Certainly some existing code would fail to parse, e.g.   (case e of [] - \x - x+1; (x:xs) - \x - x+2) That's definitely a problem. The multi-pattern lambda is nice as I think it follows naturally from function definitions

Re: [Haskell-cafe] Haskell Weekly News: Issue 153 - October 06, 2010

2010-10-06 Thread Christopher Done
Excellent! Thanks for putting this together. It's nice to have. ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] ANNOUNCE: tls, native TLS/SSL protocol implementation

2010-10-06 Thread Christopher Done
On 6 October 2010 23:26, Vincent Hanquez t...@snarc.org wrote: I'ld like to announce the tls package [1][2], which is a native implementation of the TLS protocol, client and server.  It's currently mostly supporting SSL3, TLS1.0 and TLS1.1.  It's got *lots* of rough edges, and a bunch of

Re: [Haskell-cafe] Notes from Haskell takes over the world BoF at ICFP

2010-10-06 Thread Christopher Done
A big thank you, by the way, to you, Simon Marlow, Malcom Wallace and everyone who helped getting the videos online and those that gave talks at the Haskell Implementors' Workshop 2010. It was exciting to watch all the videos! There was a lot of interesting and fertile discussion. On 6 October

Re: Re[2]: [Haskell-cafe] Lambda-case / lambda-if

2010-10-04 Thread Christopher Done
On 4 October 2010 10:55, Bulat Ziganshin bulat.zigans...@gmail.com wrote: Hello Ketil, Monday, October 4, 2010, 11:30:48 AM, you wrote: Prelude (if then Haskell else Cafe) False lambda-if is easily implemented in terms of usual functions. and we even have one named bool: bool: Bool - a -

[Haskell-cafe] Re: Haskell web development entries on the Wiki

2010-10-03 Thread Christopher Done
On 3 October 2010 06:51, Michael Snoyman mich...@snoyman.com wrote: * Does pass.net still exist anywhere? Same for parallel web. I couldn't find any references to pass.net. http://www.haskell.org/haskellwiki/Web/Existing_software I meant that I remember adding it, but I couldn't find any

[Haskell-cafe] Re: Haskell web development entries on the Wiki

2010-10-03 Thread Christopher Done
On 3 October 2010 12:10, Michael Snoyman mich...@snoyman.com wrote: I would actually do the opposite: we can put the libraries/frameworks that we are sure *are* active into the Active section and put everything else into Inactive. I have a feeling we'll be pretty close on the mark with our

[Haskell-cafe] Re: Haskell web development entries on the Wiki

2010-10-03 Thread Christopher Done
On 3 October 2010 12:31, Michael Snoyman mich...@snoyman.com wrote: I think it's fair to say that turbinado is inactive. But keep in mind that we should probably look at more than just the frameworks: servers, templating, etc. Sure, it should be a general rule across the board.

[Haskell-cafe] Re: Haskell web development entries on the Wiki

2010-10-03 Thread Christopher Done
I just discovered this: http://www.haskell.org/haskellwiki/Performance/Strictness See the Haskell Performance Resource box? That's great! I'm going to make one for our Web articles. ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org

[Haskell-cafe] Re: Haskell web development entries on the Wiki

2010-10-03 Thread Christopher Done
So I went through the Applications_and_libraries/Web_programming page and pulled out any remaining goodness from it into pages under the Web/ umbrella and then set it up as a redirect to Web/ I made an infobox which I put on every Web/ page, which makes it very nice for navigating between the

[Haskell-cafe] Re: Haskell web development entries on the Wiki

2010-10-03 Thread Christopher Done
On 3 October 2010 17:41, Michael Snoyman mich...@snoyman.com wrote: Well done, it all looks *very* nice. Regarding Yesod: yes, use the cube for now, I may eventually make a better logo, but that's it for the moment. Righteo. The only concern I have is the practical web programming in

Re: [Haskell-cafe] Problem with monad transformer stack

2010-10-03 Thread Christopher Done
On 4 October 2010 03:40, Michael Vanier mvanie...@gmail.com wrote: newtype MyMonad a =  MyMonad ((StateT (MyData a) (Either SomeError) a))  deriving (Monad,            MonadState (MyData a),            MonadError SomeError,            Typeable) I think it's the `a'. I think it needs to be a

Re: [Haskell-cafe] Lambda-case / lambda-if

2010-10-02 Thread Christopher Done
On 2 October 2010 20:23, Max Bolingbroke batterseapo...@hotmail.com wrote: Do you like this feature and think it would be worth incorporating this into GHC? Or is it too specialised to be of use? If there is enough support, I'll create a ticket and see what GHC HQ make of it. Nice work! I like

Re: [Haskell-cafe] Lambda-case / lambda-if

2010-10-02 Thread Christopher Done
I just had a look at hpaste.org, and, amusingly, the first paste has this: down - openLazyURI http://list.iblocklist.com/?list=bt_level1; case down of Left _ - error Could not download file Right bs - do input - bs ... I can

[Haskell-cafe] Re: Haskell web development entries on the Wiki

2010-10-02 Thread Christopher Done
On 2 October 2010 22:13, Michael Snoyman mich...@snoyman.com wrote: I understand the advantages to splitting into multiple pages, but on the other hand it *does* make it more difficult to locate information. It does? What's an example? I'll fix it. My guess is a good search function on the

Re: [Haskell-cafe] Non-existing types in existential quantification?

2010-10-01 Thread Christopher Done
On 1 October 2010 15:27, Henning Thielemann lemm...@henning-thielemann.de wrote: Given the following code, that is accepted by GHC: data Exist = forall a. Exist a exist :: Exist exist = Exist undefined What type has the 'undefined' ? I think its type is `a'. So far I assumed that at

Re: [Haskell-cafe] Haskell Platform, Hackage and Cabal : The 2nd Year : Status Report

2010-10-01 Thread Christopher Done
Yay, a video! Thanks, Malcolm. Much appreicated. On 1 October 2010 22:29, Malcolm Wallace malcolm.wall...@me.com wrote: The Haskell Implementors Workshop was held in Baltimore, today. Duncan Coutts from Well-Typed and I presented a status report on the Haskell distribution infrastructure:

[Haskell-cafe] Haskell web development entries on the Wiki

2010-10-01 Thread Christopher Done
Decided to move this to a separate thread. I went ahead and refactored the wiki entries: http://www.haskell.org/haskellwiki/Web Now we have the following Web/ sections: Servers Frameworks Interfaces to frameworks Databases and Persistence Libraries Testing and Verification Content Management

<    1   2   3   4   >