loli-2009.6.27: A minimum web dev DSL in HaskellSource codeContentsIndex
Network.Loli.Engine
Documentation
type RoutePath = (RequestMethod, String, AppUnit)Source
type EnvFilter = Env -> EnvSource
type ResponseFilter = Response -> ResponseSource
type Param = (String, String)Source
type AppState = ResponseSource
type AppReader = EnvSource
type AppUnitT a = ReaderT AppReader (StateT AppState IO) aSource
type AppUnit = AppUnitT ()Source
run_app :: AppUnit -> ApplicationSource
router :: [RoutePath] -> MiddlewareSource
parse_params :: String -> String -> Maybe (String, [(String, String)])Source
data Loli Source
Constructors
Loli
routes :: [RoutePath]
middlewares :: [Middleware]
mimes :: [(String, String)]
show/hide Instances
type UnitT a = State Loli aSource
type Unit = UnitT ()Source
loli :: Unit -> ApplicationSource
update :: (MonadState a m, Functor m) => (a -> a) -> m ()Source
add_route :: RoutePath -> Loli -> LoliSource
route :: RequestMethod -> String -> AppUnit -> UnitSource
add_middleware :: Middleware -> Loli -> LoliSource
add_mime :: String -> String -> Loli -> LoliSource
lookup_mime :: [(String, String)] -> MiddlewareSource
Produced by Haddock version 2.4.2