t; (Double, Vec) -> Vec
adder v1 (a, x) = axpy a x v1
how to i write this in a way which ensures recycling / fusion, e.g.
in-place updates?
best regards, ben
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailma
to know something about category theory, since
my training is in math, i don't know about girard's later work. is
there a short precis you can give (or a pointer?)
thanks and best regards, ben
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
slightly off topic, but how does one handle pausing / saving /
restarting in the FRP framework, especially the arrowized version?
i've only been able to do this via explicit (or monadic)
state-passing, e.g. imperative / piecemeal versus declarative /
wholemeal, which seems against the spirit of FRP
ing else (what?).
>
> Friendly,
> --Lane
>
> On Tue, 27 Apr 2010, Ben wrote:
>
>> slightly off topic, but how does one handle pausing / saving /
>> restarting in the FRP framework, especially the arrowized version?
>> i've only been able to do this via exp
e (i could use mealy machines or the
continuation monad), but is probably more than i need.
Peter V, Chris E : the CGI Arrow paper that Peter G mentioned may be
of interest to you.
the rest of you haskellers -- sorry, this is like the tenth time i've
posed this question, in one form or anothe
ammie wrote:
> Ben,
>
> On 29/04/2010, at 6:16 AM, Ben wrote:
>
>> [...]
>>
>> newtype STAuto s a b = STAuto { unSTAuto : (a, s) -> (b, s) }
>
> As Felipe observes in detail, this can be made to work. He uses Read and Show
> for serialisation, but clearly yo
To: haskell-cafe@haskell.org
Message-ID: <20100429030922.ga7...@kira.casa>
Content-Type: text/plain; charset=us-ascii
On Wed, Apr 28, 2010 at 04:16:08PM -0700, Ben wrote:
> so i tried state machines of a sort
>
> newtype STAuto s a b = STAuto { unSTAuto : (a, s) -> (b, s) }
>
> where
rrow
framework, which I'm excited about.
Thanks all for your help. I'm sure I'll have more questions soon enough!
Best, B
On Thu, Apr 29, 2010 at 10:06 AM, Christopher Lane Hinson
wrote:
>
> On Wed, 28 Apr 2010, Ben wrote:
>
>> thanks for the comments, i'll t
Ah, thanks!
b
On Thu, Apr 29, 2010 at 11:37 AM, Daniel Fischer
wrote:
> Am Donnerstag 29 April 2010 20:08:00 schrieb Ben:
>> A technical question: it seems like the instance of ArrowLoop is too
>> strict (this is something I've wondered about in Liu's paper
ter:
>> On Fri, Apr 30, 2010 at 3:37 AM, Daniel Fischer
>>
>> wrote:
>> > Am Donnerstag 29 April 2010 20:08:00 schrieb Ben:
>> >> A technical question: it seems like the instance of ArrowLoop is too
>> >> strict (this is something I've wonde
here?
applyLN :: Int -> StreamStateT arr a b -> [m a] . ??
perhaps it is not a good idea to mix monads and arrows in this way?
best regards, b
On Thu, Apr 29, 2010 at 11:08 AM, Ben wrote:
> Felipe --
>
> Thanks! I tried using existential types but didn't get far -- the
i have this exact problem, on linux x86_64, as well.
b
Hok Shun Poon fushunpoon at googlemail.com
Sun May 23 19:51:20 EDT 2010
Previous message: memory useage of data types in the time package
Next message: Text.Regex library with bytestrings?
Messages sorted by: [ date ] [ thread ] [ subject ] [
d installing gsl and gsl-devel to no avail.
i've tried cabal install with various options, to no avail. has
anyone else have luck with this?
best, ben
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
hi folks --
a haskell newbie here, searching for comments and wisdom on my code.
i had a project to try to implement "external sort" in haskell as a
learning exercise. (external sort is sorting a list that is too large
to fit in main memory, by sorting in chunks, spooling to disk, and
then merg
b of RAM rather
than # of elements, not sure how to get that information.
ultimately this was part of my project to write lucene for haskell. i
think with this out of the way, plus all the Data.Binary / ByteString
goodness, it shouldn't take too long. keep writing good libraries for
me!
than
for sake of argument, suppose an enterprising haskell newbie wanted to
code up concurrent b-trees (really b-link trees) in haskell. if i am
understanding STM correctly, it will NOT help in any way with the
implementation, because of the IO-intensive nature of the algorithms?
so i will have to reso
traversals?
> Yes. There's a tech report version which includes details of deletion
> which IIRC the one you mention does not. citeseer... google
do you mean "relaxed balancing made simple" by ottman and soisalon-soininen?
thanks again for all the advice!
take care, Ben
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
+1
> Message: 9
> Date: Tue, 25 Sep 2007 13:04:56 -0700
> From: Evan Klitzke <[EMAIL PROTECTED]>
> Subject: [Haskell-cafe] Haskell Cheat Sheet?
> To: haskell-cafe@haskell.org
> Message-ID: <[EMAIL PROTECTED]>
> Content-Type: text/plain
>
> Has anybody made (or have a link to) a Haskell reference c
-> mf M.! k $ v) ma
the first is obviously inefficient as it traverses the map twice. the
second just seems like it is some kind of fmap.
any ideas?
ben
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
ude Data.Map> :t intersectionWith (\a b c -> c)
intersectionWith (\a b c -> c)
:: (Ord k) => Map k a -> Map k b -> Map k (t -> t)
all of which make sense to me now, but still honestly blow my mind!
best regards, b
ps actually the first two don't make much sense to me, w
Great work!
I'm sure you're already aware of
http://sphinx.pocoo.org/
which is used to generate the Python docs. A lot of good ideas there.
One thing which would be great would be to integrate their javascript
in-browser text search engine. Obviously not a priority but it might
be nice.
Best
of fix.
trace f x = fst $ fix (\(m, z) -> f (x, z))
fix f = trace (\(x, y) -> (f y, f y)) undefined
Does this mean we can translate arbitrary recursive functions into
ArrowLoop equivalents?
Best regards, Ben
___
Haskell-Cafe mailing list
Haske
> ArrowLoop equivalents?
>>
>
> Yes. In fact fix is used on functional languages that do not support
> recursion to have recursion (or so I heard)
In which case my question is, why is the primitive for Arrows based on
trace instead of fix?
Best regards, Ben
___
e
pointfree and pointed versions, to no avail.
Is there a (pointed or point-free) version which runs in linear time
and constant space?
Best regards, Ben
PS I tried manually translating the ArrowCircuit into a
length-preserving stream function (SF in Hughes's paper) to try to
understand what
My apologies, my space leak was in my implementation of runAuto. Ignore me!
b
On Wed, Sep 1, 2010 at 3:01 PM, Ben wrote:
> Hello Arrow-theorists --
>
> In a previous email Maciej Piechotka showed me how to construct a
> recursive function I wanted via ArrowCircuits. This
Sorry to be late coming into this conversation.
Something that has bothered me (which I have mentioned to John Lato
privately) is that it is very easy to write non-compositional code due
to the chunking. For example, there is a standard function
map :: (a -> b) -> Enumeratee a b c
whose mea
is a discussion of this in knuth i think. it
shouldn't be hard to make this work, i just didn't have time when i
wrote it.
ben
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
apM runOne vs) initialState
is not possible as it has an ambiguous type.
1) what am i doing wrong? what are the right type class and instance
declarations?
2) is there a better way of expressing this kind of "on-line"
calculation, perhaps in pure (non-monadic) functions? i tried
mapAcc
f any developments.
best, ben
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
on how it is to be run.
best, b
On Jun 25, 2013, at 1:03 PM, Ben wrote:
> hello cafe --
>
> by now i'm sure you have heard that the homotopy type theory folks have just
> written up a free introductory book on their project.
>
> http://homotopytypetheory.org/2
isn't this what zippers are for?
b
On Aug 30, 2013, at 1:04 PM, Clark Gaebel wrote:
> I don't think a really smart compiler can make that transformation. It looks
> like an exponential-time algorithm would be required, but I can't prove that.
>
> GHC definitely won't...
>
> For this specific
I'm just starting to learn Haskell, and I'm having some confusion (I
think) with how the type inference is working. Can someone explain
why, in ghc 6.8.2 this works:
*Main> (1/3)^3
3.7037037037037035e-2
But this doesn't
*Main> (\k -> (1/k) ^ k) 3
:1:8:
Ambiguous type variable `t' in t
On Feb 25, 2008, at 4:11 PM, Philippa Cowderoy wrote:
On Mon, 25 Feb 2008, Ben wrote:
:1:8:
Ambiguous type variable `t' in the constraints:
`Fractional t' arising from a use of `/' at :1:8-10
`Integral t' arising from a use of `^' at :1:7-15
Probable
the
evaluation of dat2 and presumably therefore the filehandle is at least
half-closed.
any suggestions?
take care, Ben
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
be
said in the docs about decodeFile et al holding handles. (i
understand this is not the fault of binary per se as much as haskell's
non-strict semantics, but a reminder for noobs like me would be
helpful.) and finally something like strictDecodeFile' might be
useful in the librar
o
c <- B.hGetContents h
return $! decode c
seems to work like Data.Binary.decodeFile but explicitly closes the handle.
take care, ben
On Sun, Apr 20, 2008 at 4:35 PM, Ben <[EMAIL PROTECTED]> wrote:
> FWIW, installed bytestring-0.9.1.0, ran ghc-pkg hide
> bytestring
167 seconds.
You may ask, why use mapM if you're discarding the values?
Unfortunately in my real app I need the values, which are more
interesting than IO ().
?
Take care, Ben
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
e a bigger deal than GCing 2% more
memory.
best regards, Ben
module Main where
import System.IO (openFile, IOMode(..), hPutStr)
testlst = let ls = [(i, [(j, (fromIntegral j)::Float) | j <-
[1..5]::[Int]]) | i <- [1..50]::[Int]]
in ls
main = do
h <- openFile "bardump
he non-reversing one though again that's probably an artifact.)
In any case, I have some questions:
1) Why is the Prelude mapM so slow? It seems like running 10x slower
than mapM_ when generating only 50,000 return values is a problem.
2) Is there a reason to not use mapM3 above?
Thanks a
ar what is making it slow. I am guessing it
has something to do with extra thunks due to laziness, but a 10x
slowdown?
Thanks again, B
On Thu, Apr 24, 2008 at 4:45 PM, Luke Palmer <[EMAIL PROTECTED]> wrote:
> On Thu, Apr 24, 2008 at 11:28 PM, Ben <[EMAIL PROTECTED]> wrote:
> &g
hi haskellers,
have the issues with castIOUArray (and thus hGetArray, hPutArray) in
Data.Array.IO discussed below been resolved?
http://www.haskell.org/pipermail/libraries/2003-January/thread.html
here is a (trivial) program which has rather unexpected behavior.
(i'm switching to Data.Binary in
orked great for me so far.
take care, ben
On 5/2/08, Don Stewart <[EMAIL PROTECTED]> wrote:
> midfield:
>
> > hi haskellers,
> >
> > have the issues with castIOUArray (and thus hGetArray, hPutArray) in
> > Data.Array.IO discussed below been resolved?
&
i've gone and cabal installed a lot of packages, but now i want to go
back and install their profiling libraries and documentation. is
there an easy way of doing this, short of reinstalling all of them (in
the proper dependency order)?
ben
___
Ha
a place where I can
find one?
Thanks a lot in advance,
ben
[1] http://www.cs.ut.ee/~varmo/papers/thesis.pdf
[2]
http://www.iis.sinica.edu.tw/~scm/2007/encoding-inductive-and-coinductive-types-in-polymorphic-lambda-calculus/
[3]http://homepages.inf.ed.ac.uk/wadler/papers/fr
http://arstechnica.com/business/news/2012/02/transactional-memory-going-mainstream-with-intel-haswell.ars
would any haskell STM expert care to comment on the possibilities of hardware
acceleration?
best, ben
___
Haskell-Cafe mailing list
Haskell-Cafe
perhaps it is too late to suggest things for GSOC --
but stephen tetley on a different thread pointed at aaron turon's work, which
there's a very interesting new concurrency framework he calls "reagents" which
seems to give the best of all worlds : it is declarative and compositional like
STM,
or
a global clock as in Transactional Locking II.) for the second, right now i'm
wondering if i'm going to have to write a compiler for a little DSL; i'd like
to be able to exploit applicative performance gains generally, and special case
1-CAS.
best, ben
On Apr 6, 2012, at 5
i'm not sure what your email is pointing at. if it is unclear, i understand
the difference between applicative and monadic. i suppose the easy answer to
why applicative can be faster than monadic is that you can give a more
specialized instance declaration. i was just wondering if there was a
sing.
>
> Do I have that correct?
>
>
> On Fri, Apr 20, 2012 at 4:05 PM, Ben wrote:
> i'm not sure what your email is pointing at. if it is unclear, i understand
> the difference between applicative and monadic. i suppose the easy answer to
> why applica
this
must be a problem that has either been solved or else there is a haskell point
of view on it i'm not grasping which avoids the need for this data structure.
maybe there is a way of writing this as an interpreter or using some existing
monad, like the ST monad?
best, ben
[1] - Fr
s to avoid the problem entirely.) i don't know what to
search for, something like interpreters with environments with heterogeneous
types. i find the circuit-diagram / functional representation the most
interesting, but it seems unfortunately syntactically impossible.
best, ben
_
just to add to the ridiculousness quotient of this conversation
http://web.archive.org/web/20080406183542/http://www.lisperati.com/landoflisp/panel01.html
(i don't know where to find this other than in the web archive.)
ben
On Jun 18, 2012, at 1:44 PM, Christopher Done wrote:
> On
be fast enough to work pleasantly with large datasets.
ggplot2 is pretty awesome but kills my machine, routinely.
i would be willing to mentor, but i'm not an expert enough i think!
best, ben
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
that's too bad, i used lazy deserialization for an external sort thing i did
aeons ago.
http://www.haskell.org/pipermail/haskell-cafe/2007-July/029156.html
that was an amusing exercise in lazy IO. these days it's probably better off
doing something with pipes et al instead of unsafeInterleaveI
but it seems to be a good alternative.
http://asciidoc.org/
http://asciidoctor.org/docs/what-is-asciidoc-why-use-it/
best, ben
On Apr 27, 2013, at 11:06 AM, Bryan O'Sullivan wrote:
> On Sat, Apr 27, 2013 at 2:23 AM, Alistair Bayley wrote:
> How's about Creole?
> http://wi
ought it'd be a helpful pointer to
whomever is working on new haddock -- they are of course welcome to ignore it.
totally understand that overmuch debate is not helpful (though i'm not sure
it's fair to call it bikeshedding, since it is a primary feature of the
proposed project!
category theory encompasses more than just algebra. so there are
homomorphisms, but also diffeomorphisms, symplectomorphisms, et cetera (in
addition to things which don't have the -morphism suffix in normal usage, like
continuous maps, natural transformations.)
b
On Nov 6, 2010, at 7:19 A
hello --
has anyone every implemented (and benchmarked) timsort in haskell?
http://bugs.python.org/file4451/timsort.txt
it is a stable mergesort-like algorithm, seems like a good fit for haskell.
best, ben
___
Haskell-Cafe mailing list
Haskell-Cafe
hello cafe-istas --
for those of you who are into these things, a lot of the shootout programs are
suffering from "make errors" and thus do not have benchmarks.
http://shootout.alioth.debian.org/u64q/haskell.php
best, ben
Begin forwarded message:
> From: Don Stewart
> Date:
patrick perry has a nice binding to some of BLAS and LAPACK
https://github.com/patperry/hs-linear-algebra
it's been a while but i think it uses Vector.
hope he doesn't mind me publicizing it!
b
On Sep 9, 2011, at 6:23 AM, Stefan Kersten wrote:
> On 9/9/11 1:44 PM, Aleksey Khudyakov wrote:
>>
On Fri, Feb 5, 2010 at 5:51 PM, Chris Eidhof wrote:
> Approach 2: I installed the 'download-curl' package, and tried again. This
> seems to fail on the following example:
>
>> import Network.Curl.Download
>>
>> main = do x <- openURI "http://haskell.org";
>> y <- openURI "http://haskell
eads so that multiple Haskell threads can be involved in
external calls simultaneously."
IIRC, with -threaded, the RTS spawns a separate OS thread for 'safe' foreign
calls _in addition_ to the OS threads used for Haskell code (the number of
which you give with the +RTS -N option).
Cheers
Ben
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
On Thu, Feb 18, 2010 at 8:07 AM, Evan Laforge wrote:
> And BTW again, here's something I've occasionally found useful:
>
> -- | Handy to merge or sort a descending list.
> reverse_compare :: (Ord a) => a -> a -> Ordering
> reverse_compare a b = case compare a b of
> LT -> GT
> EQ -> EQ
>
read. This is very bad for performance
and only serves one purpose: to enable interoperation with broken C
libraries (i.e. those which use thread local storage, a bad, bad, bad thing
IMVHO).
Cheers
Ben
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
ME+ COMMAND
5702 ben 20 0 1112m 933m 3628 R 92.2 28.3 18:26.08 darcs
One point to notice is that 2.3.99.2 has not yet reported any progress,
whereas 2.2.1 almost immediately starts reporting something about pristine
trees followed by the usual number/number stuff; and
Ben Franksen wrote:
> b...@sarun[1]: .../rtems/rtems-4.9.0 > time darcs whatsnew -l
>
> Well, it is still running after 18 minutes! Top reports something like
>
> PID USER PR NI VIRT RES SHR S %CPU %MEMTIME+ COMMAND
> 5702 ben 20 0 1112m 933m 3628
Ben Franksen wrote:
> b...@sarun[1]: .../rtems/rtems-4.9.0 > /usr/local/bin/darcs --version
> 2.2.1 (release)
> b...@sarun[1]: .../rtems/rtems-4.9.0 > time /usr/local/bin/darcs whatsnew
> -l
> # ...long output elided...
> /usr/local/bin/darcs whatsnew -l 381,45s user
I can't answer your question (about getting minBy into the libraries)
but I thought I'd point out some tricks:
On Sat, Feb 20, 2010 at 10:47 AM, Andrew Coppin
wrote:
> Also, constructions like
>
> sortBy (compare `on` foo)
>
> must surely be very common.
Common enough that Data.Ord introduces c
2010/2/21 Vojtěch Knyttl :
> Hello,
>
> I am trying to create STArray with newListArray like this:
> la x y = newListArray ((1,1),(x,y)) [(x'+y') | x' <- [1..x], y' <- [1..y]]
>
> – but it does not work:
> No instance for (MArray a Field m)
Notice that newListArray has a monadic return type:
newL
;import release 4.9.0' 143,33s user 6,57s system 69% cpu
3:34,22 total
vs.
b...@sarun[1]: .../rtems/rtems-4.9.0 > /home/ben/.cabal/bin/darcs --version
2.3.99.2 (release candidate 2)
b...@sarun[1]: .../rtems/rtems-4.9.0 > time /home/ben/.cabal/bin/darcs
record -lam'import release 4.9
Ben Franksen wrote:
> The situation with record is similar.
>
> I admit that the huge RTEMS tree with over 7000 changes between the two
> releases is challenging. However, earlier releases can do it (though it
> takes long, much longer than with, say, mercurial).
Just for compa
entally delegated all your OpenGL calls to
the same OS thread. It might turn out bad next time you run the program, or
on another machine, or after adding more threads. Been there...
Cheers
Ben
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http:
On Sun, Feb 21, 2010 at 7:10 PM, Max Bolingbroke
wrote:
>
> You might be able to get somewhere by writing a custom "main" function
> in C and linking it in. According to
> http://haskell.org/ghc/docs/latest/html/users_guide/options-phases.html
> if a lib specified with the -l option during compila
On Wed, Feb 24, 2010 at 1:24 PM, Christian Maeder
wrote:
> 1. break the line after "do"
> (to avoid a layout change when change name or arguments of float' or
> rename the variable "e")
You can also break it immediately before do, which I think is
sometimes more clear.
___
On Wed, Feb 24, 2010 at 1:53 PM, Fabian Roth wrote:
> Hi all,
> I am trying to read structured data from a socket and return a lazy list of
> records. However, the socket reading operation seems to be strict and never
> returns (until stack overflow).
>
This is expected behaviour. Normal sequenci
On Tue, Feb 23, 2010 at 1:08 AM, Paul Brauner wrote:
> Hello,
>
> I remember seeing something like
>
>> typedata T = A | B
>
> somewhere, where A and B are type constructors, but I can't find it in
> the ghc doc. Have I been dreaming or is it some hidden feature ?
>
> Paul
> __
On Sat, Feb 27, 2010 at 9:29 AM, Brandon S. Allbery KF8NH
wrote:
> On Feb 27, 2010, at 04:07 , zaxis wrote:
>>
>> xxxMain = do
>> timeout <- getEnv "xxx_TIMEOUT"
>> case timeout of
>> Just str | [(t, _)] <- reads str -> do
>> addTimeout t (hPutStrLn stderr "*** TIMEOUT" >> _exi
On Wed, Mar 3, 2010 at 6:15 AM, Ivan Miljenovic
wrote:
> On 3 March 2010 16:11, Tom Hawkins wrote:
>> -Wall only complains about shadow bindings, defined but not used, and
>> no type signature. But no unmatched patterns.
>
> Yes it does: one of the options it brings in is
> -fwarn-incomplete-pat
On Wed, Mar 3, 2010 at 6:30 PM, Thomas DuBuisson
wrote:
> On Wed, Mar 3, 2010 at 10:26 AM, Pradeep Wickramanayake
> wrote:
>> getItemFile :: IO String
>
> This says getItemFile is an action that returns a string. No arguments.
>
>> getItemFile test = ...
>
> And your implementation obviously re
On Sun, Mar 7, 2010 at 3:44 PM, George Colpitts
wrote:
> /usr/bin/hsc2hs: line 16: unexpected EOF while looking for matching `"'
> /usr/bin/hsc2hs: line 17: syntax error: unexpected end of file
Sounds like a problem with hsc2hs itself.
> When I installed ghc on Snow Leopard I followed the instru
ell.org/package/attoparsec
This would also be a perfect question to ask on the haskell-cafe mailing list...
Cheers,
Ben.
On 11/03/2010, at 10:39 AM, John D. Earle wrote:
> I was thinking of ways to create an efficient Haskell parser. My initial
> thinking was to write a top down parser in Has
On Sat, Mar 13, 2010 at 3:19 AM, wren ng thornton wrote:
>
> The usual approach I've seen is not to distinguish strict and lazy
> datatypes, but rather to distinguish strict and lazy functions, e.g. by
> having two different arrows: (->) for lazy functions and (!->) for strict
> ones.[1]
>
But wh
roposed OzHaskell might align and/or
combine with other events such as SAPLING[1] and fp-syd[2]. There is also the
ICFP programming contest in a few months that many people will be interested
in...
Hosting is not a problem. If people want to come to Sydney then I'm sure we can
organise a r
that know, the more pressure we can bring upon ourselves to get
> something organised.
>
> I was planning on forwarding this onto the FP-Syd list, but maybe I could ask
> you to do that Ben? These mailing list things are before my time, and I
> wouldn't have a clue what to do -_-
expression: (show a) a
In the definition of `trace2': trace2 a = (show a) a
How do I fix it?
Thanks,
Ben
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
flags: -XPatternSignatures
This doesn't seem to resolve the problem. What do I need to do to change the
compiler flags?
Thanks,
Ben
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
Thank you. I'm using GHC 6.8.2. I can't see ghc-options in the file
/root/.cabal/config, am I looking in the right place?
Ben
On Wed, Mar 24, 2010 at 1:30 AM, Ivan Miljenovic
wrote:
> On 24 March 2010 16:26, Ben Derrett wrote:
> > cabal install cgi
> > Resolving depend
On Fri, Apr 2, 2010 at 12:40 AM, Christopher Done
wrote:
> That's true, it's a nice idea but in practice it's hard to know where
> to focus. I've gone with a left nav. I've built up the HTML which is
> cross-browser (ie6/7/8/opera/firefox/safari/chrome compat), still need
> to add some bits but I
On Fri, Apr 2, 2010 at 4:36 AM, Ben Millwood wrote:
> The
> easiest thing to do on visiting the website is read about why Haskell
> is so great, and where to find out how to use it.
>
Uhm, I meant the easiest thing *should be* reading about...
Sorr
On Mon, Apr 5, 2010 at 3:35 PM, Kim-Ee Yeoh wrote:
>
> Something I've noticed is the phenomenon of Help Vampires [1] on this list.
>
> Amy Hoy: "As soon as an open source project, language, or what-
> have-you achieves a certain notoriety—its half-life, if you will—
> they swarm in, seemingly drai
On Wed, Apr 7, 2010 at 2:22 AM, Thomas Schilling
wrote:
> I have
> set a maximum width on purpose so that it doesn't degrade too badly on
> big screens.
I've never really trusted this argument - it's not required that the
browser window occupy the entire screen, so why not let the user
choose how
On Sun, Apr 11, 2010 at 10:54 PM, Jason Dagit wrote:
> Or, you could use witness types:
> data Vehicle classification = Vehicle { ... }
> mkCar :: Vehicle Car
> mkTruck :: Vehicle Truck
> Then you would export the smart constructors, (mkCar/mkTruck) without
> exporting the Vehicle constructor.
> m
On Fri, Apr 16, 2010 at 2:40 PM, Phyx wrote:
> So same error. This isn't just limited to HSE though, it can't find packages
> like random,time etc either. Keeps reinstalling them on every cabal install.
> C:\Users\Phyx\AppData\Roaming\ghc\i386-mingw32-6.13.20100320\package.conf.d:
> QuickCheck
On Sat, Apr 17, 2010 at 9:50 PM, Daniel Fischer
wrote:
>
> {-# LANGUAGE OverlappingInstances, [...]
>
but with caution:
using OverlappingInstances is the haskell equivalent of
buying a new car with high safety rating and replacing the air bags
with poison gas, pouring lubricating oil all over t
On Sun, Apr 18, 2010 at 12:45 AM, Daniel Fischer
wrote:
> Am Sonntag 18 April 2010 01:23:07 schrieb Ben Millwood:
>> On Sat, Apr 17, 2010 at 9:50 PM, Daniel Fischer
>>
>> wrote:
>> > {-# LANGUAGE OverlappingInstances, [...]
>>
>> but with caution:
>&g
I have an interest in both game programming and artificial life. I have
recently stumbled on Haskell and would like to take a stab at programming a
simple game using FRP such as YAMPA or Reactive but I am stuck. I am not
certain which one I should choose. It seems that Reactive is more active but
i
>
> On Apr 21, 2010, at 6:39 PM, Luke Palmer wrote:
>
> On Wed, Apr 21, 2010 at 4:47 PM, Ben Christy
> wrote:
>
> I have an interest in both game programming and artificial life. I have
>
> recently stumbled on Haskell and would like to take a stab at programming a
On Sat, May 1, 2010 at 1:41 PM, Roly Perera
wrote:
> I can't for example find Control.Monad.State. I guess I'm missing
> something obvious about how things are organised?
The following places might therefore be of interest:
http://hackage.haskell.org/package/mtl
http://hackage.haskell.org/packag
On Sat, May 1, 2010 at 3:33 PM, Ivan Lazar Miljenovic
wrote:
> You need to know which library they're in.
You can use the ghc-pkg tool to do this:
$ ghc-pkg find-module Control.Monad.State
/usr/lib/ghc-6.12.1/package.conf.d
monads-fd-0.0.0.1
mtl-1.1.0.2
On Thu, May 6, 2010 at 4:05 AM, Ivan Miljenovic
wrote:
> Re-CC'ing -cafe:
>
> On 6 May 2010 12:54, Leonel Fonseca wrote:
>> I wasn't aware of GeneralizedNewtypeDeriving.
>> I just edited the source file Language.Haskell.TH.Syntax
>> and left:
>>
>> newtype Q a = Q { unQ :: forall m. Quasi m => m
1 - 100 of 700 matches
Mail list logo