on-a-horse-0.3: "Haskell on a Horse" - A combinatorial web framework

Safe HaskellNone

Web.Horse

Documentation

newtype FormIn Source

Constructors

FormIn [(String, String)] 

Instances

class HasFormOut o whereSource

withInput :: (ArrowReader FormIn a', ArrowAddLabel a a', ArrowAddAutomaton a1 a' a'1) => a1 (e, String, Maybe String) b -> a e bSource

withInput0 :: (ArrowReader FormIn a', ArrowAddLabel a a') => a' (e, String, Maybe String) b -> a e bSource

restify :: ArrowAddAutomaton a may a' => a (t, t1, Maybe t2) o -> may (t, t1, Maybe t2) oSource

enumForm :: (ArrowAddAutomaton a1 may a', ArrowAddLabel a may, ArrowReader FormIn may) => String -> [(String, b)] -> a () (String, Maybe b)Source

runSubStream :: ArrowChoice a => a i o -> a (Maybe i) (Maybe o)Source

filterDiffs :: (ArrowAddAutomaton a may a', Eq i, ArrowApply a') => a i (Maybe i)Source

keepState :: ArrowAddAutomaton a may a' => o -> a (Maybe o) oSource

replaceSecond :: (ArrowAddAutomaton a may a', ArrowAddAutomaton a1 may1 a') => a1 i o -> a (i, Maybe (a1 i o)) oSource

once :: ArrowAddAutomaton a may a' => a1 -> a a2 (Maybe a1)Source

auto :: Automaton t t1 t2 -> t t1 (t2, Automaton t t1 t2)Source

throwMayAuto :: (ArrowReader FormIn a1, ArrowError (a i o) cat, ArrowAddAutomaton a may (LabeledArrow a1)) => cat (may i o) cSource

throwAuto :: (ArrowReader FormIn a1, ArrowError (a i o) t1, ArrowAddAutomaton a may (LabeledArrow a1)) => t1 (a i o) tSource

linkForm :: (ArrowReader FormIn a', ArrowReader FormIn a3, ArrowError (a2 i o) a1, ArrowAddAutomaton a1 a' a'1, ArrowAddAutomaton a2 may (LabeledArrow a3), ArrowAddLabel a a') => String -> may i o -> a () StringSource

staticUrls :: a -> [(String, a)] -> [String] -> aSource

type Url = [String]Source

compact :: Eq b => MVar [(b, b1)] -> IO ()Source