[Haskell-cafe] Hackage is down?

2012-07-12 Thread Edward Amsden
http://www.downforeveryoneorjustme.com/hackage.haskell.org -- Edward Amsden Student Computer Science Rochester Institute of Technology www.edwardamsden.com ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo

Re: [Haskell-cafe] Receiving UDP messages on Windows 7

2012-06-18 Thread Edward Amsden
SockAddrInet target > > > On my Windows 7 machine this works fine; the messages are received by the > server. It also works if I run the sendMsg program on a Linux VM which lives > on a separate IP. > So it seems that it's not a general bug but rather a problem with your >

[Haskell-cafe] Receiving UDP messages on Windows 7

2012-06-18 Thread Edward Amsden
Hi all, I have the following program, which I'm running using runghc 7.4.1 with HP2012.2 on Windows 7: == {-# LANGUAGE OverloadedStrings #-} module Main where import Network.Socket hiding (send, sendTo, recv, recvFrom) import Network.Socket.ByteString import qualified Data.Text as T import quali

Re: [Haskell-cafe] Warning when attempting to install cabal-dev on the latest HP

2012-06-13 Thread Edward Amsden
For reference to anyone coming across this: The issue is that cabal-dev does in fact depend on the old mtl, if one checks the cabal file. (Thanks to dcoutts_ on #haskell). The suggestion I received was to use virthualenv. On Wed, Jun 13, 2012 at 9:20 AM, Edward Amsden wrote: > h

[Haskell-cafe] Warning when attempting to install cabal-dev on the latest HP

2012-06-13 Thread Edward Amsden
http://hpaste.org/69885 The warning in that paste occurs when I attempt $ cabal update $ cabal install cabal-dev This is curious because it wants to install a previous version of mtl. I can't figure out why. There doesn't seem to be any dependency between cabal-dev and mtl. According to hackage,

[Haskell-cafe] link to section heading in Haddock

2012-06-08 Thread Edward Amsden
Hi all After glancing through the haddock documentation and some googling, I can't tell if there's a supported way to link to a section heading in haddock documentation. Is there? Thanks, Ed ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http:/

Re: [Haskell-cafe] Is this a correct explanation of FRP?

2012-04-04 Thread Edward Amsden
, > Paul Liu > > _______ > Haskell-Cafe mailing list > Haskell-Cafe@haskell.org > http://www.haskell.org/mailman/listinfo/haskell-cafe -- Edward Amsden Student Computer Science Rochester Institute of Technology www.edwardamsden.com ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] "Best" FRP package for newbie

2012-02-17 Thread Edward Amsden
th FRP? I am mostly interested in things related to music and > network programming, if that matters. > > Thanks in advance for your help, > > Arnaud > > ___ > Haskell-Cafe mailing list > Haskell-Cafe@haskell.org > http:/

Re: [Haskell-cafe] Concurrency strategy for 2 threads and rare events

2012-02-08 Thread Edward Amsden
ore adapted to my needs? >>> >>> Thanks! >>> >>> -- >>> JP Moresmau >>> http://jpmoresmau.blogspot.com/ >>> >>> _______ >>> Haskell-Cafe mailing list >>> Haskel

Re: [Haskell-cafe] Evaluating parallel computations in order of finishing (approximately)

2012-02-06 Thread Edward Amsden
head of the list, and it would > be the first value whose computation finished. > > Does such a thing exist? > > > Victor > > > > ___________ > Haskell-Cafe mailing list > Haskell-Cafe@haskell.org

Re: [Haskell-cafe] ANN: NubFinder : Mining Opinions on the Web

2012-02-01 Thread Edward Amsden
Since this is an announcement on the Haskell mailing list, could you clarify the relevance to Haskell? It's not immediately obvious. -- Edward Amsden On Wed, Feb 1, 2012 at 5:04 PM, dokondr wrote: > Hello, > I am pleased to announce NubFinder research project. > Goal: develop

Re: [Haskell-cafe] "lambda.fm" How can I use this to help the Haskell community?

2011-11-23 Thread Edward Amsden
Haskell-Cafe mailing list >> Haskell-Cafe@haskell.org >> http://www.haskell.org/mailman/listinfo/haskell-cafe >> > > > ___ > Haskell-Cafe mailing list > Haskell-Cafe@haskell.org > http://www.haskell.org/mailman/listinfo/

Re: [Haskell-cafe] State of play with Haskell-Cocoa (Objective-C) bindings?

2011-08-01 Thread Edward Amsden
I'm a student with very little time so I've not started yet. -- Edward Amsden Student Computer Science Rochester Institute of Technology www.edwardamsden.com ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Reactive Programming in Machine Learning

2011-07-22 Thread Edward Amsden
l.org/mailman/listinfo/haskell-cafe > -- Edward Amsden Student Computer Science Rochester Institute of Technology www.edwardamsden.com ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Animas/Yampa: ArrowChoice?

2011-07-15 Thread Edward Amsden
. >> Or is there a different solution, which I >> overlooked? > If I understand the thesis about the Frag game correctly it uses > rSwitch, or rpSwitch, to make a dynamic switch: > http://www.haskell.org/haskellwiki/Yampa/rSwitch > http://haskell.org/haskellwiki/Frag The

Re: [Haskell-cafe] maybe a GHC bug but not sure

2011-06-01 Thread Edward Amsden
And after a lot more sleep and some digging, it turns out that the build script was forcing GCC to build the .o file as a 32 bit binary, and thus causing the "magic" mismatch. On Mon, May 30, 2011 at 11:20 PM, Edward Amsden wrote: > When building the Haskell Objective C bindi

[Haskell-cafe] maybe a GHC bug but not sure

2011-05-30 Thread Edward Amsden
ing at the magic bits for an object file while compiling a source file? Any insight appreciated. -- Edward Amsden Student Computer Science Rochester Institute of Technology www.edwardamsden.com ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] ErrorT vs Either

2011-05-16 Thread Edward Amsden
t. > > but > > Control.Monad.Error Prelude> (fail "msg") :: (Either String Int) > *** Exception: msg The Monad instance for Either is defined generally, e.g. "instance Monad (Either a) where" so there is know way of typechecking a fail method that injects a string in

Re: [Haskell-cafe] Good reads?

2011-04-26 Thread Edward Amsden
th examples, commentary, and extensive references for further reading." http://www.haskell.org/wikiupload/8/85/TMR-Issue13.pdf, page 13 And from a fellow student: have fun! -- Edward Amsden Student Computer Science Rochester Institute of Technology www.edwardamsden.com _

[Haskell-cafe] Inputs to classic FRP: unsafeInterleaveIO/unsafePerformIO

2011-04-25 Thread Edward Amsden
behavior is a value, which when evaluated at a specific time would have to either block its evaluation until input could be read, or check the input at that particular time. Is there any other way of implementing external behaviors besides that? -- Edward Amsden Student Computer Science Rochester

Re: [Haskell-cafe] redefining a type class for one instance?

2011-04-12 Thread Edward Amsden
On Tue, Apr 12, 2011 at 3:13 PM, Henning Thielemann wrote: > > On Tue, 12 Apr 2011, Edward Amsden wrote: > >> I am trying as an experiment to write something as follows: >> >> data Wrapper a b where >>  Pure :: (a -> b) -> Wrapper a b >>  Nullable

[Haskell-cafe] redefining a type class for one instance?

2011-04-12 Thread Edward Amsden
a in this instance) -- Edward Amsden Student Computer Science Rochester Institute of Technology www.edwardamsden.com ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Dynamically linked executables

2011-03-30 Thread Edward Amsden
ly, doesn't show any open ticket on the matter. > > Anyone has more details about this? > > > Thanks, > > AB > > ___________ > Haskell-Cafe mailing list > Haskell-Cafe@haskell.org > http:/

Re: [Haskell-cafe] Uncertainty analysis library?

2011-03-21 Thread Edward Amsden
ing approach. The intervals library seemed a bit like what I'm looking for, except that it appears to be broken for the later ghc 6 versions and ghc 7. -- Edward Amsden Student Computer Science Rochester Institute of Technology www.edwardamsden.com ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Uncertainty analysis library?

2011-03-20 Thread Edward Amsden
t process. >> I have an unreleased library for working with Taylor models that builds on >> top of that and my automatic differentiation library, but without working >> MPFR bindings, it isn't sufficiently accurate for me to comfortably release. >> -Edward >> >> On S

[Haskell-cafe] Uncertainty analysis library?

2011-03-20 Thread Edward Amsden
Hi cafe, I'm looking for a library that provides an instance of Num, Fractional, Floating, etc, but carries uncertainty values through calculations. A scan of hackage didn't turn anything up. Does anyone know of a library like this? Thanks! -- Edward Amsden Student Computer Science

Re: [Haskell-cafe] Uninstall Haskell Platform on Mac OS X

2011-03-14 Thread Edward Amsden
uninstall it? > Thanks, > Jesse > ___ > Haskell-Cafe mailing list > Haskell-Cafe@haskell.org > http://www.haskell.org/mailman/listinfo/haskell-cafe > > -- Edward Amsden Student Computer Science Rochester Institute of Technology www.edwardamsden.com

[Haskell-cafe] hsc2hs not figuring out #include paths?

2011-03-10 Thread Edward Amsden
eader files. Any ideas? How do I set the include path (via cabal or just in hsc2hs) for hsc2hs? -- Edward Amsden Student Computer Science Rochester Institute of Technology www.edwardamsden.com ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org

Re: [Haskell-cafe] segfault when using ghc api

2011-02-28 Thread Edward Amsden
cted by setContext. Perhaps we are using different api versions? I'm using 6.12.3 2011/2/28 Daniel Schüssler : > Hi, > > On 2011-February-27 Sunday 16:20:06 Edward Amsden wrote: >> Secondly, >> >> I'd like to get to a GHC session that just has, say, Prelude in

Re: [Haskell-cafe] segfault when using ghc api

2011-02-27 Thread Edward Amsden
r this. > > Just install ghc-paths with cabal, import Ghc.Paths and call runGhc > with (Just libdir), it should get past the segfault. > > On Sun, Feb 27, 2011 at 10:51 AM, Edward Amsden wrote: >> I'm trying to run the following code. I'm not at all sure it's &

[Haskell-cafe] segfault when using ghc api

2011-02-27 Thread Edward Amsden
LoadAllTargets dyn <- dynCompileExpr s return $ fromDynamic dyn main = do (s:_) <- getArgs e <- evalString s putStrLn $ maybe "oops" id e -- Edward Amsden Undergraduate Computer Science Rochester Institute of Technology www.edwardamsden.com __

Re: [Haskell-cafe] Unable to get parallelism using `par`

2011-02-19 Thread Edward Amsden
e? Do you still have to specify -threaded at compile-time? (Sorry for the dup Andrew, missed the 'reply all' button :\) -- Edward Amsden Undergraduate Computer Science Rochester Institute of Technology www.edwardamsden.com ___ Haskell-Cafe mailin

[Haskell-cafe] hsc2hs not using foreign.c types?

2011-02-07 Thread Edward Amsden
Can I declare a foreign import of a c function that takes a c 'int' to have a 'word32' input type in Haskell and will that function correctly? - Why doesn't hsc2hs use 'CInt' instead? -- Edward Amsden Undergraduate Computer Science Roch

Re: [Haskell-cafe] OSX i386/x86 and x86_64 - time to switch supported platforms?

2011-02-04 Thread Edward Amsden
Steve Severance wrote: > Moving from x86 to x64 has advantages and disadvantages from my POV. > Advantages: >  * Able to address more memory >  * More registers for code generation >  * Haskell dependencies wouldn't need to be built for x86 on Snow >Leopard (though if we swapped to x64 on Leop

[Haskell-cafe] companies using Haskell or other FP languages near Rochester?

2011-01-31 Thread Edward Amsden
ecause I'd also like to take one or two classes at my school (Rochester Institute of Technology) over the summer. Any ideas? -- Edward Amsden Undergraduate Computer Science Rochester Institute of Technology www.edwardamsden.com ___ Haskell-Cafe

Re: [Haskell-cafe] Playing sounds in Haskell

2011-01-29 Thread Edward Amsden
___ > Haskell-Cafe mailing list > Haskell-Cafe@haskell.org > http://www.haskell.org/mailman/listinfo/haskell-cafe > -- Edward Amsden Undergraduate Computer Science Rochester Institute of Technology www.edwardamsden.com ___

Re: [Haskell-cafe] 3GB allocation, 75% CPU usage from a callback function

2011-01-29 Thread Edward Amsden
Thanks much! On Sat, Jan 29, 2011 at 12:01 PM, Daniel Fischer wrote: > On Saturday 29 January 2011 17:29:02, Edward Amsden wrote: >> (Note that the function produced by newSinWave is the one actually >> registered as a callback: >> >> newSinWave :: Int -> Fl

[Haskell-cafe] 3GB allocation, 75% CPU usage from a callback function

2011-01-29 Thread Edward Amsden
n a sound callback (or perhaps not), but 3GB of memory is ridiculous. Thoughts/hints/"you're doing it wrong" anyone? -- Edward Amsden Undergraduate Computer Science Rochester Institute of Technology www.edwardamsden.com ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Conditionals and case expressions in do blocks

2011-01-26 Thread Edward Amsden
] > http://www.haskell.org/ghc/docs/latest/html/libraries/base/Control-Monad.html#6 > > On Wed, Jan 26, 2011 at 2:22 PM, Edward Amsden wrote: >> Inside a do block, I can very conveniently substitute >> >> let x = >> >> >> for either >> x <-

[Haskell-cafe] Conditionals and case expressions in do blocks

2011-01-26 Thread Edward Amsden
ressions (at least in my experience). Is there some nasty semantic ambiguity that comes of this? Is it just not in the standard yet? Is there some extension that I'm not aware of? -- Edward Amsden Undergraduate Computer Science Rochester Institute of Technolo

[Haskell-cafe] Haddock: generate documentation for all functions?

2011-01-03 Thread Edward Amsden
exported as a part of a module? -- Edward Amsden Undergraduate Computer Science Rochester Institute of Technology www.edwardamsden.com ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Could someone give me a small code review

2010-12-31 Thread Edward Amsden
off until a good solution arrives. > I plan to move over to monads next. > Any comments welcome, > Aaron > > ___ > Haskell-Cafe mailing list > Haskell-Cafe@haskell.org > http://www.haskell.org/mailman/listinfo/haskell-cafe &g

Re: [Haskell-cafe] Polymorphic function over pairs of maybes.

2010-12-28 Thread Edward Amsden
Maybe is not Nothing. Jake: I'd prefer to not have to define class instances for the types. It would get tedious and awkward quickly. (See above for a description of what I'm looking for.) -- Edward Amsden Undergraduate Computer Science Rochester Institute of

[Haskell-cafe] Polymorphic function over pairs of maybes.

2010-12-28 Thread Edward Amsden
it is or isn't? -- Edward Amsden Undergraduate Computer Science Rochester Institute of Technology www.edwardamsden.com ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] identity function

2010-12-20 Thread Edward Amsden
> Haskell-Cafe mailing list > Haskell-Cafe@haskell.org > http://www.haskell.org/mailman/listinfo/haskell-cafe > > -- -- Edward Amsden Undergraduate Computer Science Rochester Institute of Technology ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Emacs mode for Happy?

2010-12-03 Thread Edward Amsden
e one myself? -- Edward Amsden Undergraduate Computer Science Rochester Institute of Technology ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] install GHC 7.0.1 RC on OS X?

2010-11-01 Thread Edward Amsden
ild from source, that requires me to use my current GHC, which (as I understand) would build for 32 bit. What other options do I have, or am I misunderstanding something? -- Edward Amsden Undergraduate Computer Science Rochester Institute of Technology _

Re: [Haskell-cafe] Why is TChan GHC specific?

2010-05-14 Thread Edward Amsden
> All of STM (Software Transactional Memory) is GHC-specific. Hm, it's odd that only TChan mentions it... ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Why is TChan GHC specific?

2010-05-13 Thread Edward Amsden
On Wed, May 12, 2010 at 3:29 PM, Peter Robinson wrote: > As far as I know, TChan needs the 'retry' combinator which requires GHC's RTS. > Same is true for TMVar, I think. (sorry for the doubling peter, I forgot reply-all) OK. I'm new to this and probably didn't know where to look, but I didn't k

[Haskell-cafe] Why is TChan GHC specific?

2010-05-12 Thread Edward Amsden
I'm currently just getting into playing around with concurrency in haskell, primarily because I find STM intriguing. In looking through the docs I noticed that the transactional channels are GHC specific. http://hackage.haskell.org/packages/archive/stm/2.1.1.2/doc/html/Control-Concurrent-STM-TChan.

Re: [Haskell-cafe] More Language.C work for Google's Summer of Code

2010-03-30 Thread Edward Amsden
some reading to understand why you're saying it's such a big undertaking. > > Thanks, > Aaron > > > [1] http://mcpp.sourceforge.net/ > > > On Mar 30, 2010, at 1:46 PM, Edward Amsden wrote: > >> I'd be very much interested in working on th

[Haskell-cafe] GSOC Idea: Simple audio interface

2010-03-30 Thread Edward Amsden
I would like to write an audio interface for haskell for GSoC. The idea is to have a simple frontend (possibly an analog to the IO 'interact' function) that would permit writing simple functions to process audio. The interface would permit easy usage of various audio APIs on various platforms to p

Re: [Haskell-cafe] More Language.C work for Google's Summer of Code

2010-03-30 Thread Edward Amsden
I'd be very much interested in working on this library for GSoC. I'm currently working on an idea for another project, but I'm not certain how widely beneficial it would be. The preprocessor and pretty-printing projects sound especially intriguing. On Tue, Mar 30, 2010 at 1:30 PM, Aaron Tomb wrot