growler: A revised version of the scotty library that attempts to be simpler and more performant.

[ library, mit, web ] [ Propose Tags ]

Growler provides a very similar interface to scotty, with slight tweaks for performance and a few feature tradeoffs. Growler provides the ability to abort actions (handlers) with arbitrary responses, not just in the event of redirects or raising errors. Growler avoids coercing everything into lazy Text values and reading the whole request body into memory. It also eliminates the ability to abort the handler and have another handler handle the request instead (Scotty's next function).

API is still in flux, so use at your own risk. Pull requests / issues are welcome.

{-# LANGUAGE OverloadedStrings #-}

import Web.Growler
import Data.Monoid ((<>))

main = growl id defaultConfig $ do
  get "/" $ text "Hello, World!"
  get "/:name" $ do
    name <- param "name"
    text ("Hello, " <> name <> "!")

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

  • No Candidates
Versions [RSS] 0.1.0.0, 0.1.0.1, 0.2.0, 0.3.0, 0.3.1, 0.3.2, 0.4.0, 0.5.0, 0.5.0.1, 0.6.0
Dependencies aeson (>=0.8), base (>=4.6 && <5), blaze-builder (>=0.3 && <0.7), bytestring (>=0.10 && <0.20), case-insensitive (>=1.2), either (>=4.3.1), http-types (>=0.8 && <1), lens (>=4.5 && <5), monad-control (>=1 && <2), mtl (>=2.1 && <3), pipes (>=4.0 && <4.2), pipes-aeson (>=0.4), pipes-wai (>=3), regex-compat (>=0.95 && <1), text (>=1.1 && <2), transformers (>=0.3 && <0.5), transformers-base (>=0.4), unordered-containers (>=0.2 && <0.9), vector (>=0.7.1), wai (>=3.0 && <4), wai-extra (>=3.0 && <4), warp (>=3) [details]
License MIT
Author Ian Duncan
Maintainer ian@iankduncan.com
Category Web
Home page http://github.com/iand675/growler
Uploaded by IanDuncan at 2015-02-21T02:42:43Z
Distributions
Reverse Dependencies 2 direct, 0 indirect [details]
Downloads 7703 total (26 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs available [build log]
Last success reported on 2015-02-21 [all 1 reports]