apiary-0.4.0.1: Simple web framework inspired by scotty.

Safe HaskellNone
LanguageHaskell2010

Control.Monad.Apiary

Contents

Synopsis

Documentation

data ApiaryT c m a Source

Instances

type Apiary c = ApiaryT c IO Source

runApiaryT :: Monad m => ApiaryConfig -> (forall x. m x -> IO x) -> ApiaryT [] m a -> Application Source

getter

execute action

action :: Monad m => Fn c (ActionT m ()) -> ApiaryT c m () Source

action_ :: Monad m => ActionT m () -> ApiaryT c m () Source

Singletons

data SList as where Source

Constructors

SNil :: SList [] 
SCons :: a -> SList xs -> SList (a : xs) 

type family Fn as r Source

Instances

type Fn ([] *) r = r 
type Fn ((:) * x xs) r = x -> Fn xs r 

type family Snoc as a :: [*] Source

Instances

type Snoc ([] *) a = (:) * a ([] *) 
type Snoc ((:) * x xs) a = (:) * x (Snoc xs a) 

sSnoc :: SList as -> a -> SList (Snoc as a) Source

Reexport