apiary: Simple web framework inspired by scotty.

[ library, mit, web ] [ Propose Tags ]

Simple web framework inspired by scotty.

{-# LANGUAGE QuasiQuotes #-}
{-# LANGUAGE OverloadedStrings #-}

import Web.Apiary
import Network.Wai.Handler.Warp
import qualified Data.ByteString.Lazy.Char8 as L
import Control.Monad

main :: IO ()
main = run 3000 . runApiary def $ do
  [capture|/:Int|] . queryFirst' "name" . stdMethod GET . action $ \age name -> do
      guard (age >= 18)
      contentType "text/html"
      lbs . L.concat $ ["<h1>Hello, ", L.fromStrict name, "!</h1>"]
  • Nestable route handling(ApiaryT Monad; capture, stdMethod and more.).

  • type safe route filter.

full example & tutorial: https://github.com/philopon/apiary/blob/master/examples/main.lhs

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, 0.3.0.0, 0.3.1.0, 0.3.2.0, 0.4.0.0, 0.4.0.1, 0.4.0.2, 0.4.2.0, 0.4.3.0, 0.4.3.1, 0.4.3.2, 0.5.0.0, 0.5.1.0, 0.6.0.0, 0.6.0.1, 0.6.1.0, 0.7.0.0, 0.8.0.0, 0.9.0.0, 0.10.0, 0.11.0, 0.11.1, 0.11.2, 0.11.3, 0.12.0, 0.12.1, 0.12.2, 0.12.3, 0.12.4, 0.12.5, 0.12.6, 0.12.7, 0.12.8, 0.13.0, 0.14.0, 0.14.0.1, 0.15.0, 0.15.1, 0.15.2, 0.16.0, 0.17.0, 0.17.1, 0.17.2, 1.0.0, 1.1.0, 1.1.1, 1.1.2, 1.1.3, 1.1.4, 1.2.0, 1.2.1, 1.2.2, 1.2.3, 1.3.0, 1.4.0, 1.4.1, 1.4.2, 1.4.3, 1.4.4, 1.4.5, 2.0.0, 2.0.1, 2.0.1.1, 2.0.2, 2.1.0, 2.1.1, 2.1.2 (info)
Dependencies base (>=4.7 && <4.8), blaze-builder (>=0.3 && <0.4), bytestring (>=0.10 && <0.11), conduit (>=1.1 && <1.2), data-default-class (>=0.0 && <0.1), http-types (>=0.8 && <0.9), mime-types (>=0.1 && <0.2), monad-control (>=0.3 && <0.4), monad-logger (>=0.3 && <0.4), mtl (>=2.1 && <2.3), template-haskell (>=2.9 && <2.10), text (>=1.1 && <1.2), transformers (>=0.3 && <0.5), transformers-base (>=0.4 && <0.5), wai (>=2.1 && <2.2), warp (>=2.1 && <2.2) [details]
License MIT
Copyright (c) 2014 Hirotomo Moriwaki
Author HirotomoMoriwaki<philopon.dependence@gmail.com>
Maintainer HirotomoMoriwaki<philopon.dependence@gmail.com>
Category Web
Home page https://github.com/philopon/apiary
Bug tracker https://github.com/philopon/apiary/issues
Source repo head: git clone git://github.com/philopon/apiary.git
Uploaded by HirotomoMoriwaki at 2014-05-15T20:39:06Z
Distributions
Reverse Dependencies 15 direct, 0 indirect [details]
Downloads 56493 total (94 in the last 30 days)
Rating 2.5 (votes: 3) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs uploaded by user
Build status unknown [no reports yet]