Yes Haskell is not strong on the GUI end of things but have you
considered turning your desktop app into a web app? I've done this for
a few things and really enjoyed the process. Haskell's STM is what
makes this so nice.
Basically the you start a Haskell service on port
and make AJAX calls to it
Hi all,
I would like to learn a little bit more about metaprogramming in
Haskell. And I'm also wondering why metaprogramming is used much more
in Ocaml than in Haskell.
Camlp4 (Ocaml's metaprogramming facility) doesn't seem to much more
powerful that Template Haskell. The former is celebrated in i
Check out Hint [1].
[1] http://hackage.haskell.org/package/hint
On 4/3/10, Casey Hawthorne wrote:
> Apparently, Erlang does not have a static type system, since with hot
> code loading, this is intrinsically difficult.
>
> "Erlang Programming", Francesco Cesarini & Simon Thompson, June 2009,
>
> (3) conceptually rich DSL is your best friend as human-computer interface.
I agree that a well-designed DSL is *my* best friend but I suspect it
would be my grandma's worst enemy. And a badly-designed DSL is also
everybody's worst enemy.
Also a traditional GUI is discoverable without a user-manu
DSL
> shold be user-specific
> knoledge discovery (bidirectionally)though transferable as skill.
This is interesting. I am always looking for new ideas in GUI design.
Could you elaborate on this? Do you have examples of where this has
been successful?
-deech
___
http://www.amazon.com/dp/0596517742
On 4/3/10, Heinrich Apfelmus wrote:
> Michael Vanier wrote:
>> aditya siram wrote:
>>> Yes Haskell is not strong on the GUI end of things but have you
>>> considered turning your desktop app into a web app? I've done this
&g
Hi all,
For the past couple of weeks I've been trying to understand
tying-the-knot style programming in Haskell.
A couple of days ago, Heinrich Apfelmus posted the following 'break'
function as part of an unrelated thread:
break [] = ([],[])
break (x:xs) = if x == '\n' then ([],xs) else (x:ys,
You need a method that will find the length of a list:
length :: [a] -> Int
and a method that will applies a function to every element of a list
and make a list of the results:
map :: (a ->b) -> [a] -> [b]
Try and put them together.
hth,
-deech
On 4/10/10, boblettoj wrote:
>
> Hi i want to kn
Sorry to interject a noob comment, and maybe I am not understanding
the question but why not just call MonadState etc. Monad subclasses?
"get" and "put" would then be Monad subclass functions.
-deech
On 4/12/10, Stephen Tetley wrote:
> Hi Conor
>
> Chuan-kai Lin uses 'effect basis' in the ICFP p
> forced to switch to Ocaml
That like saying that you broke up with Miss America and started going
out with the runner-up. Sucks to be you :)
I experimented with Ocaml for a little while and among other things I
found that technology stack that comes with GHC (compared to Ocaml) is
quite a bit n
Hi all,
I haven't seen a "Haskell Weekly News" in a while. Is there anything I
can do to help?
-deech
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
I'm a little confused about this too. I've seen many functions defined like:
f x = (\s -> ...)
which is a partial function because it returns a function and is the same as:
f x s = ...
Off the top of my head the State monad makes extensive use if this
style. Is this bad?
- deech
On 5/2/10, B
l.org/package/hlint
On 5/3/10, Ivan Miljenovic wrote:
> On 3 May 2010 14:17, aditya siram wrote:
>> I'm a little confused about this too. I've seen many functions defined
>> like:
>> f x = (\s -> ...)
>> which is a partial function because it returns a function
I missed the part where you talked about -Wall. Sorry.
On 5/3/10, aditya siram wrote:
> Cool. That makes way more sense.
>
> I thought that ghc -Wall picked these up. So at least this problem
> would go away if warnings were turned on (and heeded) by default.
>
> Beside
This is awesome! GHC-devs , please mainline the CONTRACT pragma.
-deech
On 5/4/10, Edward Kmett wrote:
> The papers are available here: http://gallium.inria.fr/~naxu/pub.html
>
> But in general you can say things like the following:
>
> (Dana Xu uses a slightly different notation that I can never
Haskell has bindings to USB [1]. I don't know of any USB tutorials or
any webcam specific libraries.
-deech
[1] http://hackage.haskell.org/package/usb
On 5/19/10, Eitan Goldshtrom wrote:
> Hi everyone,
>
> I would like to start working on a program that requires access to a
> camera attached to
> Monstro
I'm going to call it that from now on. Stay out of the IO Monstro.
-deech
On 5/27/10, Mike Dillon wrote:
> begin C. McCann quotation:
>> Personally, I advocate instead using "Sinister" and "Dexter". Nice and
>> catchy, don't you think?
>
> Has anyone done a "translation" of the Prelude
Hi all,
I have a reproducible bug in Emacs' Haskell mode where Emacs gets
stuck in an endless loop. I am using GNU Emacs 23.0.93.1. To
reproduce:
1. Use a bad Language pragma eg.
{-# LANGUAGE FlexibleTypes #-}
2. Load a GHCI instance with C-c C-l. GHCI outputs the following error:
unsupported e
Tying the documentation to the source code
> achieves this (mostly), but it seems like there should be a Better
> Way(tm)... I'm not sure what though.
Does Haddock support Literate Haskell files? This might be a nice way
to keep tutorials and source code together.
Also perhaps provide for each pa
Hi all,
I had an issue where using the connectTo [1] function would fail to
connect to "localhost" if my wireless card was turned off. The moment
I turned on my wireless connection it worked. But if I use connectTo
with "127.0.0.1" [2] with my network off it works.
I confirmed that "localhost' res
a patch soon), can you live
> with this temporary hack? If for some reason the answer is "no", you
> have to use low-level functions from Network.Socket module for now.
>
>
> * aditya siram [2010-06-04 14:15:47-0500]
>> Doing (1) solves my problem. What did I do and why did it
Yeah, that seems to be the issue. When I commented out the "::1.."
line it worked.
-deech
On 6/4/10, Jeremy Shaw wrote:
> Perhaps it was only listening on IPv6 ? ::1 ?
>
> - jeremy
>
> On Thu, Jun 3, 2010 at 10:30 PM, aditya siram wrote:
>
>> Hi all,
>>
stprefix
ff02::1 ip6-allnodes
ff02::2 ip6-allrouters
ff02::3 ip6-allhosts
-deech
On 6/4/10, Roman Cheplyaka wrote:
> * aditya siram [2010-06-03 22:30:33-0500]
>> Hi all,
>> I had an issue where using the connectTo [1] function would fail to
>> connect to "localhost&q
he line) the following line in /etc/hosts:
>
> ::1 localhost ip6-localhost ip6-loopback
>
> 2. executing as root the following command:
>
> rmmod ipv6
>
> * aditya siram [2010-06-04 13:51:29-0500]
>> Here's my GHCI session (with my network card off):
>> Pr
And for a few more lines of codes, you get a more flexible solution:
data Consume = Take | Skip
consumeBy :: [Consume] -> [a] -> [a]
consumeBy [] _ = []
consumeBy _[] = []
consumeBy (tOrS:takesAndSkips) (x:xs) = case tOrS of
I have a general question about this kind of approach. Tutorials on
continuations in Haskell always come with a warning about not using it
unless you have to because it makes code unreadable and
unmaintainable. Is this true in your opinion?
-deech
On 6/10/10, Job Vranish wrote:
> Yeah I don't see
It's weird I was just thinking about LP in Haskell this morning. Check out
John Milliken's dbus-core [1] written entirely in noweb. It is a pleasure to
read and I am seriously considering adopting the technique for my Haskell
projects.
-deech
[1] http://ianen.org/haskell/dbus/
On Sat, Jun 12, 201
I understand that this becomes less of an issue when
> you become more experienced with haskell. Still it will always be a good
> way
> to promote haskel-style solutions.
>
I dunno, John uses noweb to good effect. Things like import statements along
with the function definition are pretty nice an
Hi all,
Haskell is a great language and in a lot of ways it still hasn't found a
niche, but that's part of what is great about it.
But I wanted to ask people are more experienced with Haskell - what kinds of
problems is it unsuited for? Have you ever regretted using it for something?
Meaning if yo
No argument there - I'm even afraid to stick it on my resume. At least
Clojure can be snuck into the JVM without people noticing - Haskell,
unfortunately, is not that shy.
-deech
On Thu, Jun 17, 2010 at 1:11 PM, Andrew Coppin
wrote:
> aditya siram wrote:
>>
>> But I want
I've written code with less bugs in Haskell than any other language
I've used. And that's a credit to GHC and not because I'm a great
programmer.
But I still don't know how to deal with the situation where you don't
have a clear picture of your data or heterogenous data that you are
wrapping up i
I haven't seen HWN in a while. If there is still community interest,
how can we help you with this?
-deech
On Wed, Apr 28, 2010 at 2:45 AM, Joe Fredette wrote:
> While I would not be opposed to being paid, I don't think it's at all
> necessary or even really appropriate. I liken the job to volun
Neat. Thanks!
-deech
On Wed, Jun 23, 2010 at 10:06 AM, Vo Minh Thu wrote:
> 2010/6/23 aditya siram :
>> I haven't seen HWN in a while. If there is still community interest,
>> how can we help you with this?
>
> It will come back, see this thread:
> http://www.reddit
> And learning (fun) should be an important aspect of the position.
Whatever FP you're coming from, I don't think you can pick up Haskell
on the job. Haskell seems to require you to disappear into a cave for
a while, then again I haven't had the pleasure of working with
experienced Haskell programm
Right, but I assume you have local experts who are willing to teach on
site. In most companies I've worked for there is minimal training.
Haskell really needs someone who can patiently walk alongside.
I'm picturing a non-Haskell developer getting thrown into the deep
end. Now that I think about it
Firstly, do you mean "recordSale sales anArtist anAlbum" ?
First off consider a datatype to model albums - something like:
type Name = String
type Artist = String
type Sold = Int
data Album = Album Name Sold
And consider storing then in a hash [1] where the artist name is the
key and [Album] is t
Maybe the codebase he's hiring for makes heavy use of Applicative,
Traversable, unboxing etc.
-deech
On Fri, Jul 2, 2010 at 12:03 PM, Andrew Coppin
wrote:
> Edward Kmett wrote:
>>
>> "Knowledge of Haskell" means very different things to different people.
>> I'd be somewhat leery of blindly hirin
For me the easiest way to understand something like this is to follow
the transformations of the code. Here's how your examples evaluate:
> let t1 = plus (Suc (Zero)) (Suc ( Suc (Zero)))
t1 = plus (Suc (Zero)) (Suc ( Suc (Zero)))
= Suc (plus (Suc (Zero)) (Suc (Zero)))
= Suc (Suc (plus (Suc
Does this work for you?
data A a = A (Int,Int)
data B
data C
class A_Class a where
do_x :: a -> Int
instance A_Class (A B) where
do_x (A (a,b)) = a + b
instance A_Class (A C) where
do_x (A (a,b)) = a - b
-- > do_x ((A (1,2)) :: A B)
-- 3
-- > do_x ((A (1,2)) :: A C)
-- -1
-deech
On Mon,
Does this code compile? The line "type Sales = Sales Record" for
instance is wrong - it should be "data Sales = Sales Record".
Additionally "recordSale" returns an Int, not [Sales].
-deech
On Mon, Jul 5, 2010 at 10:50 AM, Mrwibbly wrote:
>
> This really helped, but now I am trying to add a new
You said it didn't compile. I somehow missed that , sorry.
-deech
On Mon, Jul 5, 2010 at 11:06 AM, aditya siram wrote:
> Does this code compile? The line "type Sales = Sales Record" for
> instance is wrong - it should be "data Sales = Sales Record".
> Additi
getInt :: IO Int
getInt = getLine >>= return . read
On Mon, Jul 5, 2010 at 11:36 AM, Mrwibbly wrote:
>
> I changed that line to say type Sales = Sales Record. But unfortunately it
> still fails to compile. Do you have any idea why this might be the case?
>
> -Jack
>
>
t; (getTitle a) /=
title) sales)
-deech
On Mon, Jul 5, 2010 at 11:39 AM, aditya siram wrote:
> Yes there are a few more problems. Instead of point out each one here
> is some modified code that does compile. Compare it to what you have
> and let me know if you have questions:
>
>
If there is no real difference the one that is better supported (with
tutorials, examples etc.) will dominate the other. I don't see a
reason to unify them. Let them duke it out :)
-deech
On Wed, Jul 7, 2010 at 1:46 PM, Jonathan Daugherty wrote:
>> Anyway, the point remains, we need a single got
Haskell's FFI [1] is really nice, so you could still write your
performance-critical parts in C.
-deech
[1] http://book.realworldhaskell.org/read/interfacing-with-c-the-ffi.html
On Wed, Jul 7, 2010 at 1:54 PM, Zura_ wrote:
>
> It is ironic, but after reading your paper - "Experience Report: Has
Do you want a solution like this?
import Data.IORef
replace :: Int -> [IORef (Int,Int,Int)] -> (Int,Int,Int) -> IO ()
replace index pixels new_val = do
old_val <- return $ pixels !! index
writeIORef old_val new_val
print_pixels = mapM (\p -> readIORef p >>= print)
test_data :: [(Int,Int,Int
)
test_data :: [(Int,Int,Int)]
test_data = [(1,2,3),(4,5,6),(7,8,9)]
test_replace :: IO ()
test_replace = do
pixels <- mapM (newIORef) test_data
replace 1 pixels (10,11,12)
print_pixels pixels
in "print_pixels" "mapM" has been changed to "mapM_"
-deech
On Mo
Besides the FFI option, I know that Haskell has pretty good Lua
bindings [1] and Lua has pretty good Java bindings [2] so perhaps the
law of transitivity can work for you!
-deech
[1] http://hackage.haskell.org/package/hslua-0.2
[2] http://www.keplerproject.org/luajava/manual.html
On Mon, Jul 19,
Hi all,
I am trying to simply download a web page using the HTTP library. It
works fine with "http://www.google.com"; but a redirecting page like
"http://gmail.com"; creates an error. Code is at
http://hpaste.org/fastcgi/hpaste.fcgi/view?id=27864#a27864.
Thanks ,
-deech
___
es
it impossible for me to use this library for my project.
-deech
On Tue, Jul 20, 2010 at 3:30 PM, aditya siram wrote:
> Hi all,
> I am trying to simply download a web page using the HTTP library. It
> works fine with "http://www.google.com"; but a redirecting page like
&
Hi all,
Just wanted to document this in case others stumble across it. On
Ubuntu Lucid "curlGetString "https://" []" can sometimes
fail with (CurlSSLConnectError,""). Setting SSL to version 3
manually fixes the problem: "curlGetString "https://"
[CurlSSLVersion 3]".
This might also be of interes
Lists are non-deterministic, but the function taken by liftM2 does not
necessarily generate all possible outcomes. In the case of (+) it
does, not in the case of (-):
liftM2 (-) [0,1] [2,3] => [0-1,0-2,1-2,1-3] => [-2,-3,-1,-2]
if all possible cases were generated between the two lists we have to
i
gt; Why would you expect swapped operands to (-) ?
>
>
> Sent from my iPad
>
> On Jul 23, 2010, at 20:12, aditya siram wrote:
>
>> Lists are non-deterministic, but the function taken by liftM2 does not
>> necessarily generate all possible outcomes. In the case of (+) it
>> doe
Perhaps I'm being unclear again. All I was trying to say was that:
liftM2 (-) [0,1] [2,3] /= liftM2 (-) [2,3] [0,1]
-deech
On Sat, Jul 24, 2010 at 9:30 AM, Max Rabkin wrote:
> On Sat, Jul 24, 2010 at 4:08 PM, aditya siram wrote:
>> I wouldn't-it was a bad example. My
Eta-reducing is nice, and sometimes it makes code more readable. But 'flip'
is one of those functions that always seems to hinder rather than help
readability, conversely factoring out flip always makes code easier to
comprehend. I don't see a need for its existence - maybe I'm missing
something an
That's just cool. I now reverse my original statement - 'flip' does have
it's place in the pantheon of standard Haskell functions.
-deech
On Mon, Jul 26, 2010 at 3:42 PM, Nils wrote:
> On 26.07.2010 08:33, David Virebayre wrote:
>
>> listeEtagTot = concatMap (`listeEtagArm` cfgTypesTringle) lis
It seems confusing to alias a function without adding any functionality just
to make things slightly easier to read. Instead wouldn't it be better if
this idiom were documented on haskell.org?
-deech
On Mon, Jul 26, 2010 at 4:47 PM, Vo Minh Thu wrote:
> 2010/7/26 Vo Minh Thu :
> > 2010/7/26 Dan
We have a Google group. Doesn't that qualify?
-deech
On Mon, Jul 26, 2010 at 9:59 PM, Kurt Häusler wrote:
> Hi,
> I think it might be valuable to have a web forum. Not as a different
> interface to the same community, but as a different community.
> Perhaps the sort of people that prefer mailing
I didn't realize the State monad wasn't part of the base install. Any
particular reason for this?
-deech
On Tue, Jul 27, 2010 at 10:24 PM, Ivan Miljenovic wrote:
> On 28 July 2010 13:17, michael rice wrote:
> >
> > See below. Lot's of warnings. Is the install OK? If so, can I use the
> same *im
Each monad implementation is different. In the case of the State monad your
'execState' call extracts a non-monadic value.
Of the basic monads I found the State monad the most confusing because of
the complicated way in which it threads state through the computation. In
the end, desugaring the do-
Why are the Takusen module links on Hackage dead? I would also like to take
this opportunity to request a Takusen tutorial and to thank you for this
innovative library.
-deech
On Sun, Aug 1, 2010 at 12:59 PM, Jason Dagit wrote:
>
>
> On Sun, Aug 1, 2010 at 9:10 AM, David Anderson wrote:
> >
> >
I meant the links to the API docs.
-deech
[1]
http://hackage.haskell.org/packages/archive/Takusen/0.8.6/doc/html/Database-ODBC-Enumerator.html
On Sun, Aug 1, 2010 at 1:46 PM, Don Stewart wrote:
>
> aditya.siram:
> > Why are the Takusen module links on Hackage dead?
>
> Hmm. The links look fine
Agreed. In fact I have the most trouble imagining what Haskell code looked
like before monads.
-deech
On Mon, Aug 2, 2010 at 6:34 PM, Richard O'Keefe wrote:
> The thing that I found hardest to understand about monads is that
> they are used to obtain very special consequences (fitting things
>
Hi all,
I am doing an "Intro To Monads" talk in September [1]. The audience consists
of experienced non-Haskell developers but they will be familiar with basic
functional concepts (closures, first-class functions etc.).
I am looking for suggestions on how to introduce the concept and its
implicati
pretty quickly but it was something for me to hold onto while internalizing
the concepts. Is there a danger in telling people this?
-deech
On Tue, Aug 3, 2010 at 5:36 PM, Dan Piponi wrote:
> On Tue, Aug 3, 2010 at 2:51 PM, aditya siram
> wrote:
> > I am doing an "Intro To Monads&q
I really like the color scheme and the Javadoc looking frames.
One suggestion I can make is to have the index show all the functions with
type signatures without having to pick a letter. A lot of times I'll be
looking for a function of a certain signature as opposed to a name. Indeed
an index of t
I think what the OP is asking for is a killer application of Haskell - Ruby,
for example, is great for web programming because of Rails.
The Haskell community is somewhat unique in that it has many killer apps and
that confuses people. It's great for version control (Darcs), window
managers (XMon
Hi folks,
I just installed the latest Haskell Platform on a fresh Ubuntu Lucid machine
and I had to install the following packages to satisfy Open GL:
libgmp3-dev,libgl1-mesa-dev, libglu1-mesa-dev, freeglut3-dev
Just thought you might want to document that on the Haskell Platform page.
-deech
This is slightly OT, but is there a way of getting some Emacs keybindings in
Leksah?
-deech
On Wed, Aug 4, 2010 at 1:01 PM, Hamish Mackenzie <
hamish.k.macken...@googlemail.com> wrote:
> I use Leksah and have done since I started contributing to it. The best
> way to make it work for you is to
se, there is much more about monads, but this was my entry point.
>
> Best regards
> Daniel
>
>
> code (tree enumeration):
>
> data Tree a = Leaf a | Node (Tree a) (Tree a) deriving Show
>
> enumTree n (Node a b) =
> let (n', a') = enumTree n a in
>
10 at 4:33 AM, wren ng thornton wrote:
> aditya siram wrote:
>
>> Thanks all for you suggestions!
>> Upon further reflection I realized that my audience is more pragmatic than
>> theoretical. Instead of emphasizing how monads are constructed and the
>> monad
>&g
>
> Yes. I find that out of 10 people I train, only about 2 pick it up
> and run with it. I'm starting to believe you are either wired for
> functional programming, or you're not.
>
> I disagree that only certain brains are wired for FP. I think your
experience can be explained by people's inabil
Hi all,
I was experimenting with monad transformers and realized that the stacking
order of the monads can remain unknown until it is used. Take for example
the following code:
import "mtl" Control.Monad.State
import "mtl" Control.Monad.Writer
import "mtl" Control.Monad.Identity
test :: (MonadWri
When I tried this it never returned, there was no error.
-deech
On Thu, Aug 12, 2010 at 4:04 PM, Yitzchak Gale wrote:
> Pierre-Etienne Meunier wrote:
> > Does it still work with :
> > writeFile "output" $! process inp
>
> You're right, that changes things. Then the program prints:
>
> <>
>
> Tha
It does make a difference in certain cases. For a 2MB binary to be trivial
it assumes that (1) you are in a developed country (2) you are using a
landline internet connection and not going through your cell-phone company,
although this gap is closing fast.
I feel this India whenever I visit India.
I'd like to do it. Any tips?
-deech
On Thu, Sep 9, 2010 at 9:35 AM, Malcolm Wallace wrote:
> I miss the Haskell Weekly News.
>
> The most recent issue was published on 8th March 2010. The volunteer who
> produces it claimed on 27th April that he would be back in action "soon",
> implying that on
Hi all,
I was trying to read the documentation on monoids and the Sum type.
When I searched Hayoo for "Monoid" or "Data.Monoid", the Data.Monoid
module in "base" did not show up - Hoogle found it without a problem.
The same goes for the "Sum" type, Hayoo does not seem to find it but
Hoogle does.
-
Hi folks,
I just did a presentation on monads and how to use the basic ones
(IO,Reader,Writer,State,ReaderT,WriterT,StateT) in practice. I thought
the community might want to look at it. Is there some place I can
upload the slides (it's just PDF)?
-deech
r/haskell/
>
> On Fri, Sep 17, 2010 at 20:31, aditya siram wrote:
>>
>> Hi folks,
>> I just did a presentation on monads and how to use the basic ones
>> (IO,Reader,Writer,State,ReaderT,WriterT,StateT) in practice. I thought
>> the community might want to look a
Ok, I feel dumb. I have the slides hosted elsewhere now and I can't
figure out how to change the Reddit link. Any help is appreciated!
-deech
On Fri, Sep 17, 2010 at 1:16 PM, Matthias Kilian wrote:
> On Fri, Sep 17, 2010 at 12:54:29PM -0500, aditya siram wrote:
>> Slides share
f the moderators could delete it for me I would appreciate it.
And of course any feedback on the slide is welcome!
-deech
On Fri, Sep 17, 2010 at 2:47 PM, Heinrich Apfelmus
wrote:
> aditya siram wrote:
>>
>> Ok, I feel dumb. I have the slides hosted elsewhere now and I can't
&g
I haven't read this thread completely, but if someone else hasn't
beaten me to it, there are *lots* of Haskell idioms spelled out on the
Haskell Wiki [1] cleverly hidden under the category "Style".
-deech
[1] http://www.haskell.org/haskellwiki/Category:Style
On Fri, Sep 24, 2010 at 5:24 PM, Vo Mi
How do you guys indent long function arguments? I run into this all
the time with the 'maybe' function which takes 3 arguments:
maybe :: b -> (a -> b) -> Maybe a -> b
I usually end up doing things like (pretend the arguments are aligned
if you're not using a monospace font to view this):
maybe do-i
I imagine that getting Haskell GUI libraries set and playing nice with
the native GTK libs is a pain on Windows.
That said, I know that Haskell has very nice Lua bindings and Lua has
pretty mature GTK bindings. Has anyone tried developing their UI in
Lua with Haskell doing all the heavy lifting?
An honest list of cons mentioned up-front is a great idea and would attract
me to a language. It shows me that the community is grounded, active ,
pragmatic and helpful.
-deech
On Sun, Oct 17, 2010 at 1:45 PM, wrote:
> How about a bullet list of Haskell's features (maybe pros & cons) might be
I agree that "statically typed" comes with a lot of Java/C++ baggage. Is
there some way of saying "really statically typed", or "uncoercable
immutable statically typed values"?
-deech
On Mon, Oct 18, 2010 at 4:08 AM, DavidA wrote:
> Ketil Malde malde.org> writes:
>
> >
> > Don Stewart galois.
Hi all,
I'm having some issues calling Lua functions from Haskell. I have the
following in "Haskell2Lua.lua":
function hello ()
return "hello world"
end
And my Haskell file "Haskell2Lua.hs" looks like this:
import qualified Scripting.Lua as
Lua
main =
do
l <-
Lua.newstate
Lua.openlib
I did that, the slash is a typo. I was looking at the Lua reference manual
and it says that lua_loadfile uses lua_load[1] which outputs 0 if
successful.
Appreciate the quick response.
-deech
[1] http://www.lua.org/manual/5.1/manual.html#lua_load
On Sat, Oct 23, 2010 at 2:49 AM, Gracjan Polak wro
t;dynamic" language, by
> which I mean that definitions are created through execution.
>
> Attached is a simple example, note that there is no proper error checking -
> you probably want to check the results rather than pattern matching against
> constants.
>
> Thanks,
>
&g
Hi all,
The HsLua page [1] says that Int,Double,String,Bool,[a] and [(a,b)] types
can be converted to and from Lua values. However the on hslua API page I
don't see a StackValue instance [2] for [a] or [(a,b)]. Am I missing
something?
-deech
[1]
http://www.haskell.org/haskellwiki/HsLua#Exchanging_
I was fooled :). Some indication of that on the page would be very helpful.
-deech
On Sun, Oct 24, 2010 at 5:29 AM, Bulat Ziganshin
wrote:
> Hello aditya,
>
> Sunday, October 24, 2010, 8:05:55 AM, you wrote:
>
> HsLua page is nothing more but my fantasy about future HsLua
> development :) you ma
Are there any C libraries that you can use? I did a google search on email
client in c and failed in an epic fashion but I figure parts of sendmail or
mutt could be used.
-deech
On Wed, Oct 27, 2010 at 12:55 PM, Christopher Done wrote:
> On 27 October 2010 19:46, Thomas DuBuisson
> wrote:
> > H
Careful. That might draw some unwarranted comparisons :)
-deech
2010/10/27 Richard O'Keefe
>
> On 28/10/2010, at 4:38 AM, Günther Schmidt wrote:
> > As we are 10+ years now still without one of the most essential libraries
> any programming language needs I guess it's not that easy. It has just
I understand your frustration at not having free tested libs ready-to-go,
Java/any-other-mainstream-language programmers tend to expect this and
usually get it.
If a lack of libs is a dealbreaker for you and you want to use a functional
programming language with some of Haskell's advantages (like
I'm no compiler writer but as a layperson I'd guess for that you'd at least
need a program that could determine if two constructs are equivalent, the
Haskell and Python list comprehension example from 2 emails ago. The only
way I can think to do that is to parse some source in language X and see if
Not a city, but perhaps an island [1]. Sorry, it had to be done.
-deech
[1] http://en.wikipedia.org/wiki/Java
On Thu, Nov 4, 2010 at 11:51 AM, Stephen Tetley wrote:
> ZF Expressions (aka list comprehensions) date to at least David
> Turner's KRC (St. Andrews Static Language) and Rod Burstall and
Hi all,
I am trying to install Hare but I cannot build it. GHC complains that
package lang is not found. Here is the output:
editors/GenEditorInterfaces pfeRefactoringCmds >
refactorer/PfeRefactoringCmds.hs
cd refactorer; rm -f hidir/`uname`/Main.hi; ./myghc--make -o pfe pfe.hs 2>&1
| tee
Hi there..
Are there any Haskellers in St Louis , MO? Is there an active group here?
Want to start one?
Thanks...
Deech
_
Exercise your brain! Try Flexicon.
http://games.msn.com/en/flexicon/default.htm?icid=flexicon_hmemailtaglin
Hi all,
I'm working on a FLTK [1] GUI binding [2]. The attraction of FLTK is that
it is portable across many platforms, meaning it is easy to:
1. provide a binary for your application that works without installing
anything else. eg. no need to install X on Mac. Just double-click!
2. develop on othe
start a discussion about what the higher level abstraction should look
like. There's so many choices.
Thanks!
-deech
On Sun, Sep 8, 2013 at 8:20 PM, John Lask wrote:
> On 9/09/2013 7:09 AM, aditya siram wrote:
>
>> Hi all,
>> I'm working on a FLTK [1] GUI binding [2
1 - 100 of 177 matches
Mail list logo