This module simply re-exports from other modules for your convenience.
- module Yesod.Core
- module Yesod.Form
- module Yesod.Json
- module Yesod.Persist
- warp :: (Yesod a, YesodDispatch a a) => Int -> a -> IO ()
- warpDebug :: (Yesod a, YesodDispatch a a) => Int -> a -> IO ()
- develServer :: Int -> String -> String -> IO ()
- type Application = Request -> Iteratee ByteString IO Response
- lift :: MonadTrans t => forall m a. Monad m => m a -> t m a
- liftIO :: MonadIO m => forall a. IO a -> m a
- class MonadIO m => MonadControlIO m
- showIntegral :: Integral a => a -> String
- readIntegral :: Num a => String -> Maybe a
- hamlet :: QuasiQuoter
- xhamlet :: QuasiQuoter
- type HtmlUrl url = Render url -> Html
- type Html = HtmlM ()
- toHtml :: ToHtml a => a -> Html
- julius :: QuasiQuoter
- type JavascriptUrl url = (url -> [(Text, Text)] -> Text) -> Javascript
- renderJavascriptUrl :: (url -> [(Text, Text)] -> Text) -> JavascriptUrl url -> Text
- cassius :: QuasiQuoter
- lucius :: QuasiQuoter
- type CssUrl url = (url -> [(Text, Text)] -> Text) -> Css
- renderCssUrl :: (url -> [(Text, Text)] -> Text) -> CssUrl url -> Text
Re-exports from yesod-core
module Yesod.Core
module Yesod.Form
module Yesod.Json
module Yesod.Persist
Running your application
warp :: (Yesod a, YesodDispatch a a) => Int -> a -> IO ()Source
A convenience method to run an application using the Warp webserver on the
specified port. Automatically calls toWaiApp
.
warpDebug :: (Yesod a, YesodDispatch a a) => Int -> a -> IO ()Source
Same as warp
, but also sends a message to stderr for each request, and
an "application launched" message as well. Can be useful for development.
:: Int | port number |
-> String | module name holding the code |
-> String | name of function providing a with-application |
-> IO () |
Run a development server, where your code changes are automatically reloaded.
Commonly referenced functions/datatypes
type Application = Request -> Iteratee ByteString IO Response
lift :: MonadTrans t => forall m a. Monad m => m a -> t m a
Lift a computation from the argument monad to the constructed monad.
class MonadIO m => MonadControlIO m
MonadControlIO
is the class of IO
-based monads supporting an
extra operation liftControlIO
, enabling control operations on IO
to be
lifted into the monad.
MonadControlIO IO | |
MonadControlIO m => MonadControlIO (ListT m) | |
MonadControlIO m => MonadControlIO (SqlPersist m) | |
MonadControlIO m => MonadControlIO (MaybeT m) | |
MonadControlIO m => MonadControlIO (IdentityT m) | |
MonadControlIO m => MonadControlIO (StateT s m) | |
(Error e, MonadControlIO m) => MonadControlIO (ErrorT e m) | |
MonadControlIO m => MonadControlIO (ReaderT r m) | |
MonadControlIO m => MonadControlIO (StateT s m) | |
(Monoid w, MonadControlIO m) => MonadControlIO (WriterT w m) | |
(Monoid w, MonadControlIO m) => MonadControlIO (WriterT w m) | |
MonadControlIO m => MonadControlIO (GGHandler sub master m) | |
(Monoid w, MonadControlIO m) => MonadControlIO (RWST r w s m) | |
(Monoid w, MonadControlIO m) => MonadControlIO (RWST r w s m) |
Utilities
showIntegral :: Integral a => a -> StringSource
readIntegral :: Num a => String -> Maybe aSource
Hamlet library
Hamlet
Julius
type JavascriptUrl url = (url -> [(Text, Text)] -> Text) -> Javascript
renderJavascriptUrl :: (url -> [(Text, Text)] -> Text) -> JavascriptUrl url -> Text
Cassius/Lucius
>>>
renderLucius undefined [lucius|foo{bar:baz}|]
"foo{bar:baz}"