reflex-backend-wai: Reflex interface to `wai`

[ bsd3, frp, library, program, web ] [ Propose Tags ]

Reflex interface to wai.

A minimal example:

{-# LANGUAGE OverloadedStrings #-}
module Main where

import Network.Wai (responseLBS)
import Network.HTTP.Types.Status (status200)

import Reflex.Backend.Warp (runAppForever)

main :: IO ()
main =
  runAppForever 8080 $ \eReq -> do
    let eRes = responseLBS status200 [] "Hi" <$ eReq
    pure eRes

Downloads

Note: This package has metadata revisions in the cabal description newer than included in the tarball. To unpack the package including the revisions, use 'cabal get'.

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

Versions [RSS] 0.1.0.0
Change log ChangeLog.md
Dependencies base (>=4.9 && <4.13), containers (>=0.5 && <0.7), http-types (>=0.9.1 && <0.13), mtl (>=2.2.1 && <2.3), reflex (>=0.5 && <0.6), reflex-backend-wai, reflex-basic-host (>=0.1 && <0.2), stm (>=2.4.4 && <2.6), wai (>=3.2.1 && <3.3), warp (>=3.2.13 && <3.3) [details]
License BSD-3-Clause
Author Dave Laing
Maintainer dave.laing.80@gmail.com
Revised Revision 1 made by qfpl at 2019-04-08T05:22:12Z
Category FRP, Web
Source repo head: git clone git@github.com:qfpl/reflex-backend-wai.git
Uploaded by qfpl at 2019-04-08T04:49:31Z
Distributions
Executables example
Downloads 587 total (4 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs uploaded by user
Build status unknown [no reports yet]