We need to start referring to more haskell packages as "sexy"

/Joe

Jinjing Wang wrote:
Simplest app should look like this

    module Main where

    import Hack
    import Hack.Handler.Kibro

    hello :: Application
    hello = \env -> return $ Response
        { status  = 200
        , headers = [ ("Content-Type", "text/plain") ]
        , body    = "Hello World"
        }

    main = run hello

Hack is a brainless port of the brilliant Ruby Rack framework. Rack is
very modular and that's
very important.

Rack utilities and middlewares should be able to be ported with
minimal effort, I hope.

link / source: http://github.com/nfjinjing/hack/tree/master

begin:vcard
fn:Joseph Fredette
n:Fredette;Joseph
adr:Apartment #3;;6 Dean Street;Worcester;Massachusetts;01609;United States of America
email;internet:jfred...@gmail.com
tel;home:1-508-966-9889
tel;cell:1-508-254-9901
x-mozilla-html:FALSE
url:lowlymath.net, humbuggery.net
version:2.1
end:vcard

_______________________________________________
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe

Reply via email to