I would love to see Haskell bindings for this:
https://us.etrade.com/active-trading/api
On Tue, Oct 8, 2013 at 1:26 PM, Miro Karpis wrote:
> Please, did/does anybody tried to interface with Haskell some real-time
> stocks data API? If yes, please which one? So far I came down to
> ActveTick,...
On Tue, Aug 20, 2013 at 2:35 PM, adam vogt wrote:
> On Tue, Aug 20, 2013 at 5:00 PM, David Fox wrote:
>> This file gives me the error "Cycle in type synonym declarations" Can
>> anyone tell me why? I'm just trying to write a function to create a
>> type th
This file gives me the error "Cycle in type synonym declarations" Can
anyone tell me why? I'm just trying to write a function to create a
type that is a FooT with the type parameter fixed.
{-# LANGUAGE TemplateHaskell #-}
import Language.Haskell.TH (Q, Dec, TypeQ)
data FooT a = FooT a
foo :: T
On Wed, Jul 24, 2013 at 1:11 AM, Andreas Abel wrote:
> On 23.07.13 4:34 AM, Richard A. O'Keefe wrote:
>>
>>
>> On 22/07/2013, at 8:14 PM, Andreas Abel wrote:
>>
>>> Just today, my student asked me why the following program does nothing:
>>
>>
>> Did you ask your student why their code should not b
://hackage.haskell.org/package/module-management.
On Tue, Jul 2, 2013 at 1:36 PM, David Fox wrote:
> Ok, version 0.11.1 is probably my last upload for a while unless I get
> some specific requests, as I need to get back to real work. It adds
> the new splitModule function that lets you specify a
Ok, version 0.11.1 is probably my last upload for a while unless I get
some specific requests, as I need to get back to real work. It adds
the new splitModule function that lets you specify a function defining
which symbols go to which modules, with the old function replaced by a
call to splitModu
On Sat, Jun 29, 2013 at 12:09 PM, David Fox wrote:
> I've just uploaded version 0.10, which corrects some formatting bugs
> and incorporates most of the changes suggested in this thread. Please
> give it a try!
Version 0.10.1 is now available - it should build with GHC 7.4
I've just uploaded version 0.10, which corrects some formatting bugs
and incorporates most of the changes suggested in this thread. Please
give it a try!
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/hask
On Thu, Jun 27, 2013 at 8:46 PM, John Wiegley wrote:
>>>>>> David Fox writes:
>
>> I am pleased to announce the first release of module-management, a package
>> for cleaning import lists, and splitting and merging modules. You can see a
>> descript
On Thu, Jun 27, 2013 at 7:18 PM, Marc Weber wrote:
> Excerpts from David Fox's message of Fri Jun 28 04:04:59 +0200 2013:
>> So you will get modules Start.A, Start.B and Start.C. If there are
>
> But that's very unlikly what the programmer wants. I mean I might want
> Types and Funs as module nam
Since you pass a list of modules to merge, you can (must) specify the
order that the symbols will appear in the new module. So it is almost
an identity operation, unless the symbols went into the "OtherSymbols"
module.
On Thu, Jun 27, 2013 at 7:24 PM, Felipe Almeida Lessa
wrote:
> On Thu, Jun 27
.
modifyHsFlags - lets you pass additional flags to GHC
modifySourceDirs - lets you specify a list of directories to search
for modules. This is similar to the Hs-Source-Dirs cabal field.
On Thu, Jun 27, 2013 at 7:04 PM, David Fox wrote:
> Thanks, great feedback, clearly I've been too close to thi
Thanks, great feedback, clearly I've been too close to this to see
what people need to know. Let me give some answers, and they I will
integrate them into the documentation.
On Thu, Jun 27, 2013 at 6:06 PM, Marc Weber wrote:
> let me give you an example:
>
> splitModule :: MonadClean m => Modu
I put an intro into the top module - hackage will generate it in a
little while, but until then you can look here:
http://doc.seereason.com/libghc-module-management-doc/html/Language-Haskell-Modules.html
I commented out the test section because the test cases use the debian
module, and I didn't w
I am pleased to announce the first release of module-management, a
package for cleaning import lists, and splitting and merging modules.
You can see a description at the top of the documentation for
Language.Haskell.Modules (once it appears) here:
http://hackage.haskell.org/package/module-manageme
new-hackage is down too.
On Sat, Dec 15, 2012 at 11:05 AM, Magnus Therning wrote:
> It looks like hackage is down again. Is it planned or unplanned
> downtime this time?
>
> There doesn't happen to be some mirror of the packages that is a bit
> more reliable than the original?
>
> /M
>
> --
> Ma
I was wondering about this:
-- My goal with this instance was to make it work just enough to do what
-- I want when used with the HStringTemplate library.
instance Data UUID where
toConstr uu = mkConstr uuidType (show uu) [] (error "fixity")
gunfold _ _ = error "gunfold"
On Sat, Aug 11, 2012 at 4:13 AM, Benjamin Edwards wrote:
> Hello café,
>
> I have a program that is crashing, and I have no idea why:
>
> module Main
> where
>
> import System.Process (readProcessWithExitCode)
>
>
> main :: IO ()
> main = do _ <- readProcessWithExitCode "ghc-pkg" ["describe", "h
Its a much simpler thing, but I would like to see a template haskell
library and quasi-quoter that used a monad transformer instead of just Q.
On Thu, May 24, 2012 at 1:47 AM, Simon Peyton-Jones
wrote:
> Maybe take a look at
> http://hackage.haskell.org/trac/ghc/blog/Template%20Haskell%20Propos
On Sun, Mar 25, 2012 at 5:06 AM, Michael Snoyman wrote:
> On Sun, Mar 25, 2012 at 2:01 PM, TP wrote:
>> Hello,
>>
>> My primary problem may be reduced to adding elements of two lists:
>> [1,2,3] + [4,5,6] = [5,7,9]
>>
>> My first idea was to declare a list of Int as an instance of Num, and define
On Tue, Jan 24, 2012 at 1:00 PM, David Fox wrote:
> On Mon, Jan 23, 2012 at 1:01 PM, Joey Hess wrote:
>
>>> > Other stuff:
>>> >
>>> > separate :: (a -> Bool) -> [a] -> ([a], [a])
>>>
>>> Is this partition from Dat
On Mon, Jan 23, 2012 at 1:01 PM, Joey Hess wrote:
>> > Other stuff:
>> >
>> > separate :: (a -> Bool) -> [a] -> ([a], [a])
>>
>> Is this partition from Data.List?
>
> No; it's like break but does not include the separating character in the
> snd list.
I like let (hd, _ : tl) = break prd lst
I try to create a workflow for this sort of thing. I create a package
with a name like set-extra, with one module Data.Set.Extra and an
alternative Data.Set module that exports both the old Data.Set and the
symbols in Data.Set.Extra. Then I email the maintainers of the
Containers package with a s
On Mon, Dec 19, 2011 at 11:20 AM, Robert Clausecker wrote:
> Image you would create your own language with a paradigm similar to
> Haskell or have to chance to change Haskell without the need to keep any
> compatibility. What stuff would you add to your language, what stuff
> would you remove and
After eight years I'm still discovering why various decisions made in
Haskell are right.
On Mon, Dec 19, 2011 at 11:20 AM, Robert Clausecker wrote:
> Image you would create your own language with a paradigm similar to
> Haskell or have to chance to change Haskell without the need to keep any
> co
On Tue, Nov 22, 2011 at 5:04 AM, Jerzy Karczmarczuk
wrote:
> David Fox reacts to my criticism of his attitude towards "the meaning of
> folds":
>>
>> I'm not trying to avoid learning the differences between the different
>> folds, but I am looking for
On Sun, Nov 20, 2011 at 2:20 PM, Ivan Lazar Miljenovic
wrote:
> On 21 November 2011 03:19, David Fox wrote:
>> On Fri, Nov 18, 2011 at 1:10 AM, Ertugrul Soeylemez wrote:
>>> Ivan Lazar Miljenovic wrote:
>>>
>>>> Wasn't there talk at one stage o
the way it does" of David Fox, I compare it with a question of a young army
> officer, addressed to his elders:
>
> "Tell me how to win the war in the quickest way possible, rather than boring
> me with the explanations behind all those complicated strategies".
I'm not
Does anyone have a quick way to decide which of the fold functions to
use in a given situation? There are times when I would like to find
out which to use in the quickest way possible, rather than reading a
long explanation of why each one behaves the way it does.
On Fri, Nov 18, 2011 at 1:10 AM, Ertugrul Soeylemez wrote:
> Ivan Lazar Miljenovic wrote:
>
>> Wasn't there talk at one stage of integrating pandoc into haddock?
>
> I wouldn't mind Haddock depending on Pandoc, at least optionally
> (-fmarkdown-comments). Taking this to its conclusion you could
On Mon, Oct 17, 2011 at 5:32 PM, Conrad Parker wrote:
> On 17 October 2011 23:59, Captain Freako wrote:
>> In this excerpt from the `StateArrow' page:
>>
>> runState :: Arrow a => StateArrow s a e b -> a (e, s) (b, s)Source
>>
>> what's the significance of having written "StateArrow s a e b", ins
I'm never quite sure what the distinction is that defines the modules
under Data.*. Can anyone explain?
-david
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
On Sat, Aug 13, 2011 at 8:13 AM, Joachim Breitner
wrote:
> Hi,
>
> Am Sonntag, den 14.08.2011, 00:29 +1000 schrieb Ivan Lazar Miljenovic:
>> On 14 August 2011 00:25, David Fox wrote:
>> > Debian's packaging has a very strict changelog format where each entry
>&
On Sat, Aug 13, 2011 at 5:18 AM, Ivan Lazar Miljenovic
wrote:
> On 13 August 2011 20:57, Joachim Breitner wrote:
>> Maybe it would already help to add a "changelog-file" field to .cabal,
>> just as with license-file, and reject packages on hackage that do not
>> have this field and file, and late
On Tue, May 24, 2011 at 2:52 AM, Niklas Broberg
wrote:
>
> nibro@nibro-laptop:~/src/haskell-src-exts$ cabal sdist
> Building source dist for haskell-src-exts-1.11.1...
> Preprocessing library haskell-src-exts-1.11.1...
> Source tarball created: dist/haskell-src-exts-1.11.1.tar.gz
> nibro@nibro-lap
I would hesitate to call it a terrible decision unless I had a good
idea of what the ratio of Java programmers to Haskell programmers was
out in the world. Just sayin...
On Thu, Nov 11, 2010 at 7:14 AM, namekuseijin wrote:
> given all Oracle woes in the last few months, I'd say this is a
> terri
On Thu, Nov 4, 2010 at 2:41 PM, Albert Y. C. Lai wrote:
> On 10-11-03 10:00 PM, Jonathan Geddes wrote:
>>
>> It's called "The *Ultimate* Computer Language Guide," and it's on the
>> internets, so it must be correct, right?
>
> The correct conclusion: it's on the internets, so it must be LOL.
The
I would love to know the answer to this.
On Tue, Nov 2, 2010 at 3:36 PM, Jeremy Shaw wrote:
> Hello,
>
> I have a module, XMLGenerator, which has some overlapping instances.
> I have a second module, Test, which imports that module and also adds
> some more overlapping instances.
>
> Both modules
On Tue, Dec 29, 2009 at 10:23 AM, David Fox wrote:
> On Tue, Dec 29, 2009 at 7:28 AM, David Fox wrote:
>> Is anyone else seeing this problem:
>>
>>> :m +Text.Regex.Posix
>>> "\250" =~ "\250" :: Bool
>> True
>>> "\250"
On Tue, Dec 29, 2009 at 7:28 AM, David Fox wrote:
> Is anyone else seeing this problem:
>
>> :m +Text.Regex.Posix
>> "\250" =~ "\250" :: Bool
> True
>> "\250" =~ "[\250]" :: Bool
> False
>
Paul Tanimoto suggested TDFA, whi
Is anyone else seeing this problem:
> :m +Text.Regex.Posix
> "\250" =~ "\250" :: Bool
True
> "\250" =~ "[\250]" :: Bool
False
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
On Sat, Dec 5, 2009 at 2:38 AM, Andrea Vezzosi wrote:
> On Fri, Dec 4, 2009 at 8:51 PM, Jeremy Shaw wrote:
>> I have stripped things down to the bare minimum, and test under GHC 6.10,
>> GHC 6.12, Linux, and Mac OS X. Results are consistent.
>>
>> In the following code,
>>
>> 1. if you load the
I have created an entry in the syb-with-class issue database
here:http://code.google.com/p/syb-with-class/issues/detail?id=3
I attached a version of the code with the necessary bits of
Happstack.Data.Default included in-line.
On Thu, Dec 3, 2009 at 2:50 PM, Jeremy Shaw wrote:
> I have the follow
I assume this is the same as code.haskell.org, which is also down?
On Sun, Sep 13, 2009 at 10:31 AM, Joe Fredette wrote:
> Confirmed for me, I actually have no idea who owns C.H.O, but a WHOIS gives
> the Yale University Comp. Sci. Dept. Haskell Group as the registrant, maybe
> someone over ther
Oh, that make sense!
2009/6/25 José Pedro Magalhães
> Hey David,
>
> For instance:
>
> arity :: (Data a) => a -> Int
>> arity = length . gmapQ (const ())
>>
>
>
> Cheers,
> Pedro
>
> On Thu, Jun 25, 2009 at 17:31, David Fox wrote:
>
Is it possible to determine the arity of a value's constructor?
Suppose I have a value x of type
data A = B Int | C
They typeOf function returns its TypeRep, which contains its type
constructor, but I don't see how to decide whether that
constructor's arity is 0 or 1. If the type has field nam
What I do like about this so-called "negative" approach is that it
represents a part of a program's documentation that is usually omitted. You
can look at the code and see exactly how and (to a certain extent) why the
program does what it does, but what you can't see is all the things it
doesn't d
On Wed, Jan 21, 2009 at 9:20 AM, David Fox wrote:
> I posted a bug about this (http://hackage.haskell.org/trac/ghc/ticket/2971)
> but its so odd I had to ask here. Using ghc 6.10.1, both readFile
> "/proc/mounts" and Data.ByteString.Lazy.Char8.readFile "/proc/mounts&quo
I posted a bug about this (http://hackage.haskell.org/trac/ghc/ticket/2971)
but its so odd I had to ask here. Using ghc 6.10.1, both readFile
"/proc/mounts" and Data.ByteString.Lazy.Char8.readFile "/proc/mounts" hang
on an amd64 machine running Linux. Also, Data.ByteString.readFile
"/proc/mounts"
On Thu, Jan 15, 2009 at 9:04 AM, wrote:
> John Goerzen writes:
> > Wikipedia's first sentence about monoids is:
> >
> > In abstract algebra, a branch of mathematics, a monoid is an algebraic
> > structure with a single, associative binary operation and an identity
> > element.
> >
> > Whic
I want to use Data.Generics to write a function to turn all the Nothings in
a data structure into Just defaultValue, as shown below. I get the
following error because the compiler doesn't know enough about Maybe a for
mkT to create the generic function that everywhere requires, I guess.
Test.hs:2
I think it is a bug in the emacs shell mode.
On Feb 4, 2008 9:30 AM, Clifford Beshers <[EMAIL PROTECTED]> wrote:
> No, I cannot reproduce this.
>
> 2008/2/4 David Fox <[EMAIL PROTECTED]>:
>
> > I'm seeing the character ^D inserted into argument strings that are
I'm seeing the character ^D inserted into argument strings that are about
256 characters long with GHC 6.8.2. Anyone else?
Test.hs:
module Main where
import System.Environment
import System.IO
main =
do args <- getArgs
hPutStrLn stderr ("args: " ++ show args)
Output:
$ ghc6 --mak
Argh, that last sentence should read "the file is left alone"..
On Dec 9, 2007 10:15 PM, David Fox <[EMAIL PROTECTED]> wrote:
> Here is a practical example I ran into a few days ago. With this
> expression:
>
>writeFile path (compute text)
>
> the file at
Here is a practical example I ran into a few days ago. With this
expression:
writeFile path (compute text)
the file at path would be overwritten with an empty file if an error occurs
while evaluating (compute text). With this one:
writeFile path $! (compute text)
the file alone when an e
On Nov 27, 2007 1:33 PM, apfelmus <[EMAIL PROTECTED]> wrote:
> David Menendez wrote:
> > Thomas Davie wrote:
> >
> >> But the point is that this section of the site is the bit that's meant
> >> to be an advertisement -- we're trying to encourage people to read
> >> more,
> >
> >
> > Are we? I thou
On Nov 27, 2007 8:14 AM, Henning Thielemann <[EMAIL PROTECTED]>
wrote:
>
> On Tue, 27 Nov 2007, Thomas Davie wrote:
>
> > On 27 Nov 2007, at 14:44, David Menendez wrote:
> >
> > > On Nov 26, 2007 1:44 PM, Thomas Davie <[EMAIL PROTECTED]> wrote:
> > >
> > > But the point is that this section of the
On Nov 26, 2007 11:38 AM, Thomas Schilling <[EMAIL PROTECTED]> wrote:
>
> Haskell is a general-purpose, pure functional programming languages
> that puts many interesting results from research into a practical
> programming language. It's features include:
>
I think it is stronger to say "many
On 11/6/07, Peter Verswyvelen <[EMAIL PROTECTED]> wrote:
> So which kind Linux works best for running GHC (6.8.1) and related tools? (I
> want to give Yi a go, I can't get it to work on Windows). Debian? Fedora?
> Ubuntu?
I took an informal poll at this year's Haskell Hackathon, and well
over hal
59 matches
Mail list logo