[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

[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

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

2012-06-18 Thread Edward Amsden
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 setup, possibly a firewall. 2012/6/18 Edward Amsden eca7...@cs.rit.edu Hi all, I

[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,

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 eca7...@cs.rit.edu wrote

[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

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

2012-04-04 Thread Edward Amsden
-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
programming, if that matters. Thanks in advance for your help, Arnaud ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe -- Edward Amsden Student Computer Science Rochester Institute

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

2012-02-08 Thread Edward Amsden
/ ___ 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

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

2012-02-06 Thread Edward Amsden
___ 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

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 doko...@gmail.com 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
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

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

2011-08-01 Thread Edward Amsden
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
-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
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 switching combinators are the correct solution for dynamic systems. -- Edward Amsden Student Computer Science Rochester Institute

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 eca7...@cs.rit.edu wrote: When building the Haskell Objective C bindings

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

2011-05-30 Thread Edward Amsden
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
) :: (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 into Left in that case. -- Edward Amsden Student Computer Science Rochester Institute

Re: [Haskell-cafe] Good reads?

2011-04-26 Thread Edward Amsden
, 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
. A 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

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

2011-04-12 Thread Edward Amsden
) -- 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] redefining a type class for one instance?

2011-04-12 Thread Edward Amsden
On Tue, Apr 12, 2011 at 3:13 PM, Henning Thielemann lemm...@henning-thielemann.de 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 :: (Maybe a - b) - Wrapper a b

Re: [Haskell-cafe] Dynamically linked executables

2011-03-30 Thread Edward Amsden
___ 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

Re: [Haskell-cafe] Uncertainty analysis library?

2011-03-21 Thread Edward Amsden
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

[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 Rochester

Re: [Haskell-cafe] Uncertainty analysis library?

2011-03-20 Thread Edward Amsden
, Mar 20, 2011 at 4:27 PM, Edward Amsden eca7...@cs.rit.edu wrote: 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

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

2011-03-14 Thread Edward Amsden
___ 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
that it cannot find the header 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

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

2011-02-28 Thread Edward Amsden
versions? I'm using 6.12.3 2011/2/28 Daniel Schüssler anotheraddr...@gmx.de: 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 scope so I can use dynCompileExpr with show etc, but I cannot figure out how

[Haskell-cafe] segfault when using ghc api

2011-02-27 Thread Edward Amsden
:_) - getArgs e - evalString s putStrLn $ maybe oops id e -- 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

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

2011-02-27 Thread Edward Amsden
-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 eca7...@cs.rit.edu wrote: I'm trying to run the following code. I'm not at all sure it's correct, it's based off of a bit of poking around

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

2011-02-19 Thread Edward Amsden
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 mailing list Haskell-Cafe

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

2011-02-07 Thread Edward Amsden
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 Rochester Institute of Technology www.edwardamsden.com

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

2011-02-04 Thread Edward Amsden
Steve Severance st...@medwizard.net 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

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

2011-01-31 Thread Edward Amsden
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 mailing list Haskell

Re: [Haskell-cafe] Playing sounds in Haskell

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

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

2011-01-03 Thread Edward Amsden
that are not 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
have left it 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 -- Edward Amsden

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

2010-12-28 Thread Edward Amsden
? -- 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] Polymorphic function over pairs of maybes.

2010-12-28 Thread Edward Amsden
. 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 Technology www.edwardamsden.com

Re: [Haskell-cafe] identity function

2010-12-20 Thread Edward Amsden
://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
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
, 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 ___ Haskell-Cafe

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

[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.

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

[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

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

2010-03-30 Thread Edward Amsden
I've missed? Things you'd do differently? I'm very interested in all 3 of them, and actually somewhat in #4, though I'll have to do 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