{-# LANGUAGE OverloadedStrings, RankNTypes #-}
module Web.Scotty
(
scotty, scottyApp, scottyOpts, scottySocket, Options(..)
, middleware, get, post, put, delete, patch, options, addroute, matchAny, notFound, setMaxRequestBodySize
, capture, regex, function, literal
, request, header, headers, body, bodyReader, param, params, jsonData, files
, status, addHeader, setHeader, redirect
, text, html, file, json, stream, raw
, raise, raiseStatus, rescue, next, finish, defaultHandler, liftAndCatchIO
, Param, Trans.Parsable(..), Trans.readEither
, ScottyM, ActionM, RoutePattern, File, Kilobytes
) where
import qualified Web.Scotty.Trans as Trans
import Data.Aeson (FromJSON, ToJSON)
import qualified Data.ByteString as BS
import Data.ByteString.Lazy.Char8 (ByteString)
import Data.Text.Lazy (Text)
import Network.HTTP.Types (Status, StdMethod)
import Network.Socket (Socket)
import Network.Wai (Application, Middleware, Request, StreamingBody)
import Network.Wai.Handler.Warp (Port)
import Web.Scotty.Internal.Types (ScottyT, ActionT, Param, RoutePattern, Options, File, Kilobytes)
type ScottyM = ScottyT Text IO
type ActionM = ActionT Text IO
scotty :: Port -> ScottyM () -> IO ()
scotty :: Port -> ScottyM () -> IO ()
scotty Port
p = forall (m :: * -> *) (n :: * -> *) e.
(Monad m, MonadIO n) =>
Port -> (m Response -> IO Response) -> ScottyT e m () -> n ()
Trans.scottyT Port
p forall a. a -> a
id
scottyOpts :: Options -> ScottyM () -> IO ()
scottyOpts :: Options -> ScottyM () -> IO ()
scottyOpts Options
opts = forall (m :: * -> *) (n :: * -> *) e.
(Monad m, MonadIO n) =>
Options -> (m Response -> IO Response) -> ScottyT e m () -> n ()
Trans.scottyOptsT Options
opts forall a. a -> a
id
scottySocket :: Options -> Socket -> ScottyM () -> IO ()
scottySocket :: Options -> Socket -> ScottyM () -> IO ()
scottySocket Options
opts Socket
sock = forall (m :: * -> *) (n :: * -> *) e.
(Monad m, MonadIO n) =>
Options
-> Socket -> (m Response -> IO Response) -> ScottyT e m () -> n ()
Trans.scottySocketT Options
opts Socket
sock forall a. a -> a
id
scottyApp :: ScottyM () -> IO Application
scottyApp :: ScottyM () -> IO Application
scottyApp = forall (m :: * -> *) (n :: * -> *) e.
(Monad m, Monad n) =>
(m Response -> IO Response) -> ScottyT e m () -> n Application
Trans.scottyAppT forall a. a -> a
id
defaultHandler :: (Text -> ActionM ()) -> ScottyM ()
defaultHandler :: (Text -> ActionM ()) -> ScottyM ()
defaultHandler = forall e (m :: * -> *).
(ScottyError e, Monad m) =>
(e -> ActionT e m ()) -> ScottyT e m ()
Trans.defaultHandler
middleware :: Middleware -> ScottyM ()
middleware :: Middleware -> ScottyM ()
middleware = forall e (m :: * -> *). Middleware -> ScottyT e m ()
Trans.middleware
setMaxRequestBodySize :: Kilobytes -> ScottyM ()
setMaxRequestBodySize :: Port -> ScottyM ()
setMaxRequestBodySize = forall e (m :: * -> *). Port -> ScottyT e m ()
Trans.setMaxRequestBodySize
raise :: Text -> ActionM a
raise :: forall a. Text -> ActionM a
raise = forall e (m :: * -> *) a.
(ScottyError e, Monad m) =>
e -> ActionT e m a
Trans.raise
raiseStatus :: Status -> Text -> ActionM a
raiseStatus :: forall a. Status -> Text -> ActionM a
raiseStatus = forall e (m :: * -> *) a.
(ScottyError e, Monad m) =>
Status -> e -> ActionT e m a
Trans.raiseStatus
next :: ActionM a
next :: forall a. ActionM a
next = forall e (m :: * -> *) a. (ScottyError e, Monad m) => ActionT e m a
Trans.next
finish :: ActionM a
finish :: forall a. ActionM a
finish = forall e (m :: * -> *) a. (ScottyError e, Monad m) => ActionT e m a
Trans.finish
rescue :: ActionM a -> (Text -> ActionM a) -> ActionM a
rescue :: forall a. ActionM a -> (Text -> ActionM a) -> ActionM a
rescue = forall e (m :: * -> *) a.
(ScottyError e, Monad m) =>
ActionT e m a -> (e -> ActionT e m a) -> ActionT e m a
Trans.rescue
liftAndCatchIO :: IO a -> ActionM a
liftAndCatchIO :: forall a. IO a -> ActionM a
liftAndCatchIO = forall e (m :: * -> *) a.
(ScottyError e, MonadIO m) =>
IO a -> ActionT e m a
Trans.liftAndCatchIO
redirect :: Text -> ActionM a
redirect :: forall a. Text -> ActionM a
redirect = forall e (m :: * -> *) a.
(ScottyError e, Monad m) =>
Text -> ActionT e m a
Trans.redirect
request :: ActionM Request
request :: ActionM Request
request = forall (m :: * -> *) e. Monad m => ActionT e m Request
Trans.request
files :: ActionM [File]
files :: ActionM [File]
files = forall (m :: * -> *) e. Monad m => ActionT e m [File]
Trans.files
header :: Text -> ActionM (Maybe Text)
= forall e (m :: * -> *).
(ScottyError e, Monad m) =>
Text -> ActionT e m (Maybe Text)
Trans.header
headers :: ActionM [(Text, Text)]
= forall e (m :: * -> *).
(ScottyError e, Monad m) =>
ActionT e m [(Text, Text)]
Trans.headers
body :: ActionM ByteString
body :: ActionM ByteString
body = forall e (m :: * -> *).
(ScottyError e, MonadIO m) =>
ActionT e m ByteString
Trans.body
bodyReader :: ActionM (IO BS.ByteString)
bodyReader :: ActionM (IO ByteString)
bodyReader = forall (m :: * -> *) e. Monad m => ActionT e m (IO ByteString)
Trans.bodyReader
jsonData :: FromJSON a => ActionM a
jsonData :: forall a. FromJSON a => ActionM a
jsonData = forall a e (m :: * -> *).
(FromJSON a, ScottyError e, MonadIO m) =>
ActionT e m a
Trans.jsonData
param :: Trans.Parsable a => Text -> ActionM a
param :: forall a. Parsable a => Text -> ActionM a
param = forall a e (m :: * -> *).
(Parsable a, ScottyError e, Monad m) =>
Text -> ActionT e m a
Trans.param
params :: ActionM [Param]
params :: ActionM [(Text, Text)]
params = forall (m :: * -> *) e. Monad m => ActionT e m [(Text, Text)]
Trans.params
status :: Status -> ActionM ()
status :: Status -> ActionM ()
status = forall (m :: * -> *) e. Monad m => Status -> ActionT e m ()
Trans.status
addHeader :: Text -> Text -> ActionM ()
= forall (m :: * -> *) e. Monad m => Text -> Text -> ActionT e m ()
Trans.addHeader
setHeader :: Text -> Text -> ActionM ()
= forall (m :: * -> *) e. Monad m => Text -> Text -> ActionT e m ()
Trans.setHeader
text :: Text -> ActionM ()
text :: Text -> ActionM ()
text = forall e (m :: * -> *).
(ScottyError e, Monad m) =>
Text -> ActionT e m ()
Trans.text
html :: Text -> ActionM ()
html :: Text -> ActionM ()
html = forall e (m :: * -> *).
(ScottyError e, Monad m) =>
Text -> ActionT e m ()
Trans.html
file :: FilePath -> ActionM ()
file :: FilePath -> ActionM ()
file = forall (m :: * -> *) e. Monad m => FilePath -> ActionT e m ()
Trans.file
json :: ToJSON a => a -> ActionM ()
json :: forall a. ToJSON a => a -> ActionM ()
json = forall a e (m :: * -> *).
(ToJSON a, ScottyError e, Monad m) =>
a -> ActionT e m ()
Trans.json
stream :: StreamingBody -> ActionM ()
stream :: StreamingBody -> ActionM ()
stream = forall (m :: * -> *) e. Monad m => StreamingBody -> ActionT e m ()
Trans.stream
raw :: ByteString -> ActionM ()
raw :: ByteString -> ActionM ()
raw = forall (m :: * -> *) e. Monad m => ByteString -> ActionT e m ()
Trans.raw
get :: RoutePattern -> ActionM () -> ScottyM ()
get :: RoutePattern -> ActionM () -> ScottyM ()
get = forall e (m :: * -> *).
(ScottyError e, MonadIO m) =>
RoutePattern -> ActionT e m () -> ScottyT e m ()
Trans.get
post :: RoutePattern -> ActionM () -> ScottyM ()
post :: RoutePattern -> ActionM () -> ScottyM ()
post = forall e (m :: * -> *).
(ScottyError e, MonadIO m) =>
RoutePattern -> ActionT e m () -> ScottyT e m ()
Trans.post
put :: RoutePattern -> ActionM () -> ScottyM ()
put :: RoutePattern -> ActionM () -> ScottyM ()
put = forall e (m :: * -> *).
(ScottyError e, MonadIO m) =>
RoutePattern -> ActionT e m () -> ScottyT e m ()
Trans.put
delete :: RoutePattern -> ActionM () -> ScottyM ()
delete :: RoutePattern -> ActionM () -> ScottyM ()
delete = forall e (m :: * -> *).
(ScottyError e, MonadIO m) =>
RoutePattern -> ActionT e m () -> ScottyT e m ()
Trans.delete
patch :: RoutePattern -> ActionM () -> ScottyM ()
patch :: RoutePattern -> ActionM () -> ScottyM ()
patch = forall e (m :: * -> *).
(ScottyError e, MonadIO m) =>
RoutePattern -> ActionT e m () -> ScottyT e m ()
Trans.patch
options :: RoutePattern -> ActionM () -> ScottyM ()
options :: RoutePattern -> ActionM () -> ScottyM ()
options = forall e (m :: * -> *).
(ScottyError e, MonadIO m) =>
RoutePattern -> ActionT e m () -> ScottyT e m ()
Trans.options
matchAny :: RoutePattern -> ActionM () -> ScottyM ()
matchAny :: RoutePattern -> ActionM () -> ScottyM ()
matchAny = forall e (m :: * -> *).
(ScottyError e, MonadIO m) =>
RoutePattern -> ActionT e m () -> ScottyT e m ()
Trans.matchAny
notFound :: ActionM () -> ScottyM ()
notFound :: ActionM () -> ScottyM ()
notFound = forall e (m :: * -> *).
(ScottyError e, MonadIO m) =>
ActionT e m () -> ScottyT e m ()
Trans.notFound
addroute :: StdMethod -> RoutePattern -> ActionM () -> ScottyM ()
addroute :: StdMethod -> RoutePattern -> ActionM () -> ScottyM ()
addroute = forall e (m :: * -> *).
(ScottyError e, MonadIO m) =>
StdMethod -> RoutePattern -> ActionT e m () -> ScottyT e m ()
Trans.addroute
regex :: String -> RoutePattern
regex :: FilePath -> RoutePattern
regex = FilePath -> RoutePattern
Trans.regex
capture :: String -> RoutePattern
capture :: FilePath -> RoutePattern
capture = FilePath -> RoutePattern
Trans.capture
function :: (Request -> Maybe [Param]) -> RoutePattern
function :: (Request -> Maybe [(Text, Text)]) -> RoutePattern
function = (Request -> Maybe [(Text, Text)]) -> RoutePattern
Trans.function
literal :: String -> RoutePattern
literal :: FilePath -> RoutePattern
literal = FilePath -> RoutePattern
Trans.literal