Safe Haskell | None |
---|---|
Language | Haskell2010 |
Network.Gitit.Server
Documentation
bytestring :: HasRqData m => m a -> m a #
dir :: (ServerMonad m, MonadPlus m) => String -> m a -> m a #
method :: (ServerMonad m, MonadPlus m, MatchMethod method) => method -> m () #
class (ServerMonad m, WebMonad Response m, FilterMonad Response m, MonadIO m, MonadPlus m, HasRqData m, Monad m, Functor m, Applicative m, Alternative m) => Happstack (m :: Type -> Type) #
Instances
(Functor m, Monad m, MonadPlus m, MonadIO m) => Happstack (ServerPartT m) | |
Defined in Happstack.Server.Monads | |
(Happstack m, Monoid e) => Happstack (ExceptT e m) | |
Defined in Happstack.Server.Monads | |
Happstack m => Happstack (ReaderT r m) | |
Defined in Happstack.Server.Monads | |
Happstack m => Happstack (StateT s m) | |
Defined in Happstack.Server.Monads | |
Happstack m => Happstack (StateT s m) | |
Defined in Happstack.Server.Monads | |
(Happstack m, Monoid w) => Happstack (WriterT w m) | |
Defined in Happstack.Server.Monads | |
(Happstack m, Monoid w) => Happstack (WriterT w m) | |
Defined in Happstack.Server.Monads | |
(Happstack m, Monoid w) => Happstack (RWST r w s m) | |
Defined in Happstack.Server.Monads | |
(Happstack m, Monoid w) => Happstack (RWST r w s m) | |
Defined in Happstack.Server.Monads |
Constructors
Request | |
Instances
Show Request | |
HasHeaders Request | |
Defined in Happstack.Server.Internal.Types |
Instances
Data Method | |
Defined in Happstack.Server.Internal.Types Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Method -> c Method gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Method dataTypeOf :: Method -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Method) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Method) gmapT :: (forall b. Data b => b -> b) -> Method -> Method gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Method -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Method -> r gmapQ :: (forall d. Data d => d -> u) -> Method -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> Method -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> Method -> m Method gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Method -> m Method gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Method -> m Method | |
Read Method | |
Defined in Happstack.Server.Internal.Types | |
Show Method | |
Eq Method | |
Ord Method | |
MatchMethod Method | |
Defined in Happstack.Server.Routing Methods matchMethod :: Method -> Method -> Bool # | |
MatchMethod [Method] | |
Defined in Happstack.Server.Routing Methods matchMethod :: [Method] -> Method -> Bool # | |
MatchMethod (Method -> Bool) | |
Defined in Happstack.Server.Routing Methods matchMethod :: (Method -> Bool) -> Method -> Bool # |
Instances
Show Response | |
HasHeaders Response | |
Defined in Happstack.Server.Internal.Types | |
ToMessage Response | |
Defined in Happstack.Server.Response Methods toContentType :: Response -> ByteString # toMessage :: Response -> ByteString # toResponse :: Response -> Response # | |
Monad m => FilterMonad Response (ServerPartT m) | |
Defined in Happstack.Server.Internal.Monads Methods setFilter :: (Response -> Response) -> ServerPartT m () # composeFilter :: (Response -> Response) -> ServerPartT m () # getFilter :: ServerPartT m b -> ServerPartT m (b, Response -> Response) # | |
Monad m => FilterMonad Response (WebT m) | |
Monad m => WebMonad Response (ServerPartT m) | |
Defined in Happstack.Server.Internal.Monads Methods finishWith :: Response -> ServerPartT m b # | |
Monad m => WebMonad Response (WebT m) | |
Defined in Happstack.Server.Internal.Monads Methods finishWith :: Response -> WebT m b # |
host :: (ServerMonad m, MonadPlus m) => String -> m a -> m a #
simpleHTTP :: ToMessage a => Conf -> ServerPartT IO a -> IO () #
ok :: FilterMonad Response m => a -> m a #
class Monad m => ServerMonad (m :: Type -> Type) where #
Instances
Monad m => ServerMonad (ServerPartT m) | |
Defined in Happstack.Server.Internal.Monads Methods askRq :: ServerPartT m Request # localRq :: (Request -> Request) -> ServerPartT m a -> ServerPartT m a # | |
ServerMonad m => ServerMonad (ExceptT e m) | |
ServerMonad m => ServerMonad (ReaderT r m) | |
ServerMonad m => ServerMonad (StateT s m) | |
ServerMonad m => ServerMonad (StateT s m) | |
(ServerMonad m, Monoid w) => ServerMonad (WriterT w m) | |
(ServerMonad m, Monoid w) => ServerMonad (WriterT w m) | |
(ServerMonad m, Monoid w) => ServerMonad (RWST r w s m) | |
(ServerMonad m, Monoid w) => ServerMonad (RWST r w s m) | |
getHeaderM :: ServerMonad m => String -> m (Maybe ByteString) #
basicAuthBy :: Happstack m => (ByteString -> ByteString -> Bool) -> String -> m a -> m a #
validLoginPlaintext :: Map String String -> ByteString -> ByteString -> Bool #
addCookie :: (MonadIO m, FilterMonad Response m) => CookieLife -> Cookie -> m () #
addCookies :: (MonadIO m, FilterMonad Response m) => [(CookieLife, Cookie)] -> m () #
expireCookie :: (MonadIO m, FilterMonad Response m) => String -> m () #
errorHandlerSP :: forall (m :: Type -> Type) e a. Monad m => (Request -> e -> WebT m a) -> ServerPartT (ExceptT e m) a -> ServerPartT m a #
simpleErrorHandler :: forall (m :: Type -> Type). Monad m => String -> ServerPartT m Response #
spUnwrapErrorT :: Monad m => (e -> ServerPartT m a) -> Request -> UnWebT (ExceptT e m) a -> UnWebT m a #
Constructors
EnableBrowsing | |
DisableBrowsing |
Instances
Data Browsing | |
Defined in Happstack.Server.FileServe.BuildingBlocks Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Browsing -> c Browsing gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Browsing toConstr :: Browsing -> Constr dataTypeOf :: Browsing -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Browsing) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Browsing) gmapT :: (forall b. Data b => b -> b) -> Browsing -> Browsing gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Browsing -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Browsing -> r gmapQ :: (forall d. Data d => d -> u) -> Browsing -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> Browsing -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> Browsing -> m Browsing gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Browsing -> m Browsing gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Browsing -> m Browsing | |
Enum Browsing | |
Defined in Happstack.Server.FileServe.BuildingBlocks | |
Read Browsing | |
Defined in Happstack.Server.FileServe.BuildingBlocks | |
Show Browsing | |
Eq Browsing | |
Ord Browsing | |
Defined in Happstack.Server.FileServe.BuildingBlocks |
asContentType :: Monad m => String -> FilePath -> m String #
defaultIxFiles :: [FilePath] #
fileServe :: (WebMonad Response m, ServerMonad m, FilterMonad Response m, MonadIO m, MonadPlus m) => [FilePath] -> FilePath -> m Response #
guessContentTypeM :: Monad m => MimeMap -> FilePath -> m String #
serveDirectory :: (WebMonad Response m, ServerMonad m, FilterMonad Response m, MonadIO m, MonadPlus m) => Browsing -> [FilePath] -> FilePath -> m Response #
serveFile :: (ServerMonad m, FilterMonad Response m, MonadIO m, MonadPlus m) => (FilePath -> m String) -> FilePath -> m Response #
serveFileFrom :: (ServerMonad m, FilterMonad Response m, MonadIO m, MonadPlus m) => FilePath -> (FilePath -> m String) -> FilePath -> m Response #
acceptLanguage :: Happstack m => m [(Text, Maybe Double)] #
bestLanguage :: [(Text, Maybe Double)] -> [Text] #
Constructors
Cookie | |
Fields
|
Instances
Data Cookie | |
Defined in Happstack.Server.Internal.Cookie Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Cookie -> c Cookie gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Cookie dataTypeOf :: Cookie -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Cookie) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Cookie) gmapT :: (forall b. Data b => b -> b) -> Cookie -> Cookie gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Cookie -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Cookie -> r gmapQ :: (forall d. Data d => d -> u) -> Cookie -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> Cookie -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> Cookie -> m Cookie gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Cookie -> m Cookie gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Cookie -> m Cookie | |
Read Cookie | |
Defined in Happstack.Server.Internal.Cookie | |
Show Cookie | |
Eq Cookie | |
MonadReader RqEnv RqData | |
data CookieLife #
Instances
Read CookieLife | |
Defined in Happstack.Server.Internal.Cookie Methods readsPrec :: Int -> ReadS CookieLife readList :: ReadS [CookieLife] readPrec :: ReadPrec CookieLife readListPrec :: ReadPrec [CookieLife] | |
Show CookieLife | |
Defined in Happstack.Server.Internal.Cookie Methods showsPrec :: Int -> CookieLife -> ShowS show :: CookieLife -> String showList :: [CookieLife] -> ShowS | |
Eq CookieLife | |
Defined in Happstack.Server.Internal.Cookie | |
Ord CookieLife | |
Defined in Happstack.Server.Internal.Cookie Methods compare :: CookieLife -> CookieLife -> Ordering (<) :: CookieLife -> CookieLife -> Bool (<=) :: CookieLife -> CookieLife -> Bool (>) :: CookieLife -> CookieLife -> Bool (>=) :: CookieLife -> CookieLife -> Bool max :: CookieLife -> CookieLife -> CookieLife min :: CookieLife -> CookieLife -> CookieLife |
Constructors
SameSiteLax | |
SameSiteStrict | |
SameSiteNone | |
SameSiteNoValue |
Instances
Data SameSite | |
Defined in Happstack.Server.Internal.Cookie Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SameSite -> c SameSite gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SameSite toConstr :: SameSite -> Constr dataTypeOf :: SameSite -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SameSite) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SameSite) gmapT :: (forall b. Data b => b -> b) -> SameSite -> SameSite gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SameSite -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SameSite -> r gmapQ :: (forall d. Data d => d -> u) -> SameSite -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> SameSite -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> SameSite -> m SameSite gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SameSite -> m SameSite gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SameSite -> m SameSite | |
Read SameSite | |
Defined in Happstack.Server.Internal.Cookie | |
Show SameSite | |
Eq SameSite | |
Ord SameSite | |
Defined in Happstack.Server.Internal.Cookie |
data BodyPolicy #
Constructors
BodyPolicy | |
Fields
|
defaultBodyPolicy :: FilePath -> Int64 -> Int64 -> Int64 -> BodyPolicy #
class Monad m => FilterMonad a (m :: Type -> Type) | m -> a where #
Instances
type ServerPart a = ServerPartT IO a #
data ServerPartT (m :: Type -> Type) a #
Instances
class Monad m => WebMonad a (m :: Type -> Type) | m -> a where #
Methods
finishWith :: a -> m b #
Instances
Monad m => WebMonad Response (ServerPartT m) | |
Defined in Happstack.Server.Internal.Monads Methods finishWith :: Response -> ServerPartT m b # | |
Monad m => WebMonad Response (WebT m) | |
Defined in Happstack.Server.Internal.Monads Methods finishWith :: Response -> WebT m b # | |
WebMonad a m => WebMonad a (ExceptT e m) | |
Defined in Happstack.Server.Internal.Monads Methods finishWith :: a -> ExceptT e m b # | |
WebMonad a m => WebMonad a (ReaderT r m) | |
Defined in Happstack.Server.Internal.Monads Methods finishWith :: a -> ReaderT r m b # | |
WebMonad a m => WebMonad a (StateT s m) | |
Defined in Happstack.Server.Internal.Monads Methods finishWith :: a -> StateT s m b # | |
WebMonad a m => WebMonad a (StateT s m) | |
Defined in Happstack.Server.Internal.Monads Methods finishWith :: a -> StateT s m b # | |
(WebMonad a m, Monoid w) => WebMonad a (WriterT w m) | |
Defined in Happstack.Server.Internal.Monads Methods finishWith :: a -> WriterT w m b # | |
(WebMonad a m, Monoid w) => WebMonad a (WriterT w m) | |
Defined in Happstack.Server.Internal.Monads Methods finishWith :: a -> WriterT w m b # | |
(WebMonad a m, Monoid w) => WebMonad a (RWST r w s m) | |
Defined in Happstack.Server.Internal.Monads Methods finishWith :: a -> RWST r w s m b # | |
(WebMonad a m, Monoid w) => WebMonad a (RWST r w s m) | |
Defined in Happstack.Server.Internal.Monads Methods finishWith :: a -> RWST r w s m b # |
escape :: (WebMonad a m, FilterMonad a m) => m a -> m b #
escape' :: (WebMonad a m, FilterMonad a m) => a -> m b #
escapeHTTP :: (ServerMonad m, MonadIO m) => (TimeoutIO -> IO ()) -> m a #
ignoreFilters :: FilterMonad a m => m () #
mapServerPartT :: (UnWebT m a -> UnWebT n b) -> ServerPartT m a -> ServerPartT n b #
mapServerPartT' :: (Request -> UnWebT m a -> UnWebT n b) -> ServerPartT m a -> ServerPartT n b #
data ContentType #
Constructors
ContentType | |
Fields
|
Instances
Read ContentType | |
Defined in Happstack.Server.Internal.RFC822Headers Methods readsPrec :: Int -> ReadS ContentType readList :: ReadS [ContentType] readPrec :: ReadPrec ContentType readListPrec :: ReadPrec [ContentType] | |
Show ContentType | |
Defined in Happstack.Server.Internal.RFC822Headers Methods showsPrec :: Int -> ContentType -> ShowS show :: ContentType -> String showList :: [ContentType] -> ShowS | |
Eq ContentType | |
Defined in Happstack.Server.Internal.RFC822Headers | |
Ord ContentType | |
Defined in Happstack.Server.Internal.RFC822Headers Methods compare :: ContentType -> ContentType -> Ordering (<) :: ContentType -> ContentType -> Bool (<=) :: ContentType -> ContentType -> Bool (>) :: ContentType -> ContentType -> Bool (>=) :: ContentType -> ContentType -> Bool max :: ContentType -> ContentType -> ContentType min :: ContentType -> ContentType -> ContentType |
Instances
Read RqBody | |
Defined in Happstack.Server.Internal.Types | |
Show RqBody | |
Constructors
ContentLength | |
TransferEncodingChunked | |
NoContentLength |
Instances
Enum Length | |
Defined in Happstack.Server.Internal.Types | |
Read Length | |
Defined in Happstack.Server.Internal.Types | |
Show Length | |
Eq Length | |
Ord Length | |
class FromReqURI a where #
Methods
fromReqURI :: String -> Maybe a #
Instances
FromReqURI Int16 | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Int16 # | |
FromReqURI Int32 | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Int32 # | |
FromReqURI Int64 | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Int64 # | |
FromReqURI Int8 | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Int8 # | |
FromReqURI Word16 | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Word16 # | |
FromReqURI Word32 | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Word32 # | |
FromReqURI Word64 | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Word64 # | |
FromReqURI Word8 | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Word8 # | |
FromReqURI SessionKey Source # | |
Defined in Network.Gitit.Types Methods fromReqURI :: String -> Maybe SessionKey # | |
FromReqURI Text | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Text # | |
FromReqURI Text | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Text # | |
FromReqURI String | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe String # | |
FromReqURI Integer | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Integer # | |
FromReqURI Bool | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Bool # | |
FromReqURI Char | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Char # | |
FromReqURI Double | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Double # | |
FromReqURI Float | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Float # | |
FromReqURI Int | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Int # | |
FromReqURI Word | |
Defined in Happstack.Server.Internal.Types Methods fromReqURI :: String -> Maybe Word # |
data HeaderPair #
Constructors
HeaderPair | |
Instances
Read HeaderPair | |
Defined in Happstack.Server.Internal.Types Methods readsPrec :: Int -> ReadS HeaderPair readList :: ReadS [HeaderPair] readPrec :: ReadPrec HeaderPair readListPrec :: ReadPrec [HeaderPair] | |
Show HeaderPair | |
Defined in Happstack.Server.Internal.Types Methods showsPrec :: Int -> HeaderPair -> ShowS show :: HeaderPair -> String showList :: [HeaderPair] -> ShowS | |
HasHeaders Headers | |
Defined in Happstack.Server.Internal.Types |
type Headers = Map ByteString HeaderPair #
data HttpVersion #
Constructors
HttpVersion Int Int |
Instances
Read HttpVersion | |
Defined in Happstack.Server.Internal.Types Methods readsPrec :: Int -> ReadS HttpVersion readList :: ReadS [HttpVersion] readPrec :: ReadPrec HttpVersion readListPrec :: ReadPrec [HttpVersion] | |
Show HttpVersion | |
Defined in Happstack.Server.Internal.Types Methods showsPrec :: Int -> HttpVersion -> ShowS show :: HttpVersion -> String showList :: [HttpVersion] -> ShowS | |
Eq HttpVersion | |
Defined in Happstack.Server.Internal.Types |
Constructors
Input | |
Fields
|
Instances
Read Input | |
Defined in Happstack.Server.Internal.Types | |
Show Input | |
MonadReader RqEnv RqData | |
type LogAccess time = String -> String -> time -> String -> Int -> Integer -> String -> String -> IO () #
Instances
Read RsFlags | |
Defined in Happstack.Server.Internal.Types | |
Show RsFlags | |
addHeaderBS :: HasHeaders r => ByteString -> ByteString -> r -> r #
addHeaderUnsafe :: HasHeaders r => ByteString -> HeaderPair -> r -> r #
contentLength :: Response -> Response #
continueHTTP :: Request -> Response -> Bool #
getHeaderBS :: HasHeaders r => ByteString -> r -> Maybe ByteString #
getHeaderUnsafe :: HasHeaders r => ByteString -> r -> Maybe ByteString #
hasHeaderBS :: HasHeaders r => ByteString -> r -> Bool #
hasHeaderUnsafe :: HasHeaders r => ByteString -> r -> Bool #
logMAccess :: FormatTime t => LogAccess t #
noContentLength :: Response -> Response #
nullRsFlags :: RsFlags #
readInputsBody :: Request -> IO (Maybe [(String, Input)]) #
setHeaderBS :: HasHeaders r => ByteString -> ByteString -> r -> r #
setHeaderUnsafe :: HasHeaders r => ByteString -> HeaderPair -> r -> r #
takeRequestBody :: MonadIO m => Request -> m (Maybe RqBody) #
addHeaderM :: FilterMonad Response m => String -> String -> m () #
neverExpires :: FilterMonad Response m => m () #
setHeaderM :: FilterMonad Response m => String -> String -> m () #
Minimal complete definition
Nothing
Methods
toContentType :: a -> ByteString #
toMessage :: a -> ByteString #
toResponse :: a -> Response #
Instances
ToMessage Html | |
Defined in Happstack.Server.Response Methods toContentType :: Html -> ByteString # toMessage :: Html -> ByteString # toResponse :: Html -> Response # | |
ToMessage ByteString | |
Defined in Happstack.Server.Response Methods toContentType :: ByteString -> ByteString # toMessage :: ByteString -> ByteString # toResponse :: ByteString -> Response # | |
ToMessage ByteString | |
Defined in Happstack.Server.Response Methods toContentType :: ByteString -> ByteString # toMessage :: ByteString -> ByteString # toResponse :: ByteString -> Response # | |
ToMessage Response | |
Defined in Happstack.Server.Response Methods toContentType :: Response -> ByteString # toMessage :: Response -> ByteString # toResponse :: Response -> Response # | |
ToMessage Html | |
Defined in Happstack.Server.Response Methods toContentType :: Html -> ByteString # toMessage :: Html -> ByteString # toResponse :: Html -> Response # | |
ToMessage Text | |
Defined in Happstack.Server.Response Methods toContentType :: Text -> ByteString # toMessage :: Text -> ByteString # toResponse :: Text -> Response # | |
ToMessage Text | |
Defined in Happstack.Server.Response Methods toContentType :: Text -> ByteString # toMessage :: Text -> ByteString # toResponse :: Text -> Response # | |
ToMessage Html | |
Defined in Happstack.Server.Response Methods toContentType :: Html -> ByteString # toMessage :: Html -> ByteString # toResponse :: Html -> Response # | |
ToMessage String | |
Defined in Happstack.Server.Response Methods toContentType :: String -> ByteString # toMessage :: String -> ByteString # toResponse :: String -> Response # | |
ToMessage Integer | |
Defined in Happstack.Server.Response Methods toContentType :: Integer -> ByteString # toMessage :: Integer -> ByteString # toResponse :: Integer -> Response # | |
ToMessage () | |
Defined in Happstack.Server.Response Methods toContentType :: () -> ByteString # toMessage :: () -> ByteString # toResponse :: () -> Response # | |
ToMessage a => ToMessage (Maybe a) | |
Defined in Happstack.Server.Response Methods toContentType :: Maybe a -> ByteString # toMessage :: Maybe a -> ByteString # toResponse :: Maybe a -> Response # |
badGateway :: FilterMonad Response m => a -> m a #
badRequest :: FilterMonad Response m => a -> m a #
forbidden :: FilterMonad Response m => a -> m a #
found :: (FilterMonad Response m, ToSURI uri) => uri -> res -> m res #
ifModifiedSince :: UTCTime -> Request -> Response -> Response #
internalServerError :: FilterMonad Response m => a -> m a #
movedPermanently :: (FilterMonad Response m, ToSURI a) => a -> res -> m res #
noContent :: FilterMonad Response m => a -> m a #
notFound :: FilterMonad Response m => a -> m a #
prettyResponse :: Response -> String #
requestEntityTooLarge :: FilterMonad Response m => a -> m a #
resp :: FilterMonad Response m => Int -> b -> m b #
seeOther :: (FilterMonad Response m, ToSURI uri) => uri -> res -> m res #
setResponseCode :: FilterMonad Response m => Int -> m () #
tempRedirect :: (FilterMonad Response m, ToSURI a) => a -> res -> m res #
toResponseBS :: ByteString -> ByteString -> Response #
unauthorized :: FilterMonad Response m => a -> m a #
class MatchMethod m where #
Methods
matchMethod :: m -> Method -> Bool #
Instances
MatchMethod Method | |
Defined in Happstack.Server.Routing Methods matchMethod :: Method -> Method -> Bool # | |
MatchMethod () | |
Defined in Happstack.Server.Routing Methods matchMethod :: () -> Method -> Bool # | |
MatchMethod [Method] | |
Defined in Happstack.Server.Routing Methods matchMethod :: [Method] -> Method -> Bool # | |
MatchMethod (Method -> Bool) | |
Defined in Happstack.Server.Routing Methods matchMethod :: (Method -> Bool) -> Method -> Bool # |
anyPath :: (ServerMonad m, MonadPlus m) => m r -> m r #
dirs :: (ServerMonad m, MonadPlus m) => FilePath -> m a -> m a #
guardRq :: (ServerMonad m, MonadPlus m) => (Request -> Bool) -> m () #
http :: (ServerMonad m, MonadPlus m) => m () #
https :: (ServerMonad m, MonadPlus m) => m () #
methodM :: (ServerMonad m, MonadPlus m, MatchMethod method) => method -> m () #
methodOnly :: (ServerMonad m, MonadPlus m, MatchMethod method) => method -> m () #
methodSP :: (ServerMonad m, MonadPlus m, MatchMethod method) => method -> m b -> m b #
noTrailingSlash :: (ServerMonad m, MonadPlus m) => m () #
nullDir :: (ServerMonad m, MonadPlus m) => m () #
path :: (FromReqURI a, MonadPlus m, ServerMonad m) => (a -> m b) -> m b #
trailingSlash :: (ServerMonad m, MonadPlus m) => m () #
uriRest :: ServerMonad m => (String -> m a) -> m a #
withHost :: (ServerMonad m, MonadPlus m) => (String -> m a) -> m a #
Instances
Data a => Data (Errors a) | |
Defined in Happstack.Server.RqData Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Errors a -> c (Errors a) gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Errors a) toConstr :: Errors a -> Constr dataTypeOf :: Errors a -> DataType dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Errors a)) dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Errors a)) gmapT :: (forall b. Data b => b -> b) -> Errors a -> Errors a gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Errors a -> r gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Errors a -> r gmapQ :: (forall d. Data d => d -> u) -> Errors a -> [u] gmapQi :: Int -> (forall d. Data d => d -> u) -> Errors a -> u gmapM :: Monad m => (forall d. Data d => d -> m d) -> Errors a -> m (Errors a) gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Errors a -> m (Errors a) gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Errors a -> m (Errors a) | |
Alternative (Either (Errors a)) | |
Alternative (Either (Errors a)) => MonadPlus (Either (Errors a)) | |
Monoid (Errors a) | |
Semigroup (Errors a) | |
Read a => Read (Errors a) | |
Defined in Happstack.Server.RqData | |
Show a => Show (Errors a) | |
Eq a => Eq (Errors a) | |
Ord a => Ord (Errors a) | |
Defined in Happstack.Server.RqData |
Instances
FromData GithubCallbackPars Source # | |
Defined in Network.Gitit.Authentication.Github Methods | |
FromData Command Source # | |
Defined in Network.Gitit.Types | |
FromData Params Source # | |
Defined in Network.Gitit.Types | |
FromData SessionKey Source # | |
Defined in Network.Gitit.Types Methods | |
FromData a => FromData (Maybe a) | |
Defined in Happstack.Server.RqData | |
(FromData a, FromData b) => FromData (a, b) | |
Defined in Happstack.Server.RqData | |
(FromData a, FromData b, FromData c) => FromData (a, b, c) | |
Defined in Happstack.Server.RqData | |
(FromData a, FromData b, FromData c, FromData d) => FromData (a, b, c, d) | |
Defined in Happstack.Server.RqData |
class HasRqData (m :: Type -> Type) where #
Instances
HasRqData RqData | |
Defined in Happstack.Server.RqData | |
(MonadIO m, MonadPlus m) => HasRqData (ServerPartT m) | |
Defined in Happstack.Server.RqData Methods askRqEnv :: ServerPartT m RqEnv # localRqEnv :: (RqEnv -> RqEnv) -> ServerPartT m a -> ServerPartT m a # rqDataError :: Errors String -> ServerPartT m a # | |
(Monad m, HasRqData m) => HasRqData (ExceptT e m) | |
Defined in Happstack.Server.RqData | |
(Monad m, HasRqData m) => HasRqData (ReaderT s m) | |
Defined in Happstack.Server.RqData Methods askRqEnv :: ReaderT s m RqEnv # localRqEnv :: (RqEnv -> RqEnv) -> ReaderT s m a -> ReaderT s m a # rqDataError :: Errors String -> ReaderT s m a # | |
(Monad m, HasRqData m) => HasRqData (StateT s m) | |
Defined in Happstack.Server.RqData Methods askRqEnv :: StateT s m RqEnv # localRqEnv :: (RqEnv -> RqEnv) -> StateT s m a -> StateT s m a # rqDataError :: Errors String -> StateT s m a # | |
(Monad m, HasRqData m) => HasRqData (StateT s m) | |
Defined in Happstack.Server.RqData Methods askRqEnv :: StateT s m RqEnv # localRqEnv :: (RqEnv -> RqEnv) -> StateT s m a -> StateT s m a # rqDataError :: Errors String -> StateT s m a # | |
(Monad m, HasRqData m, Monoid w) => HasRqData (WriterT w m) | |
Defined in Happstack.Server.RqData Methods askRqEnv :: WriterT w m RqEnv # localRqEnv :: (RqEnv -> RqEnv) -> WriterT w m a -> WriterT w m a # rqDataError :: Errors String -> WriterT w m a # | |
(Monad m, HasRqData m, Monoid w) => HasRqData (WriterT w m) | |
Defined in Happstack.Server.RqData Methods askRqEnv :: WriterT w m RqEnv # localRqEnv :: (RqEnv -> RqEnv) -> WriterT w m a -> WriterT w m a # rqDataError :: Errors String -> WriterT w m a # | |
(Monad m, HasRqData m, Monoid w) => HasRqData (RWST r w s m) | |
Defined in Happstack.Server.RqData Methods askRqEnv :: RWST r w s m RqEnv # localRqEnv :: (RqEnv -> RqEnv) -> RWST r w s m a -> RWST r w s m a # rqDataError :: Errors String -> RWST r w s m a # | |
(Monad m, HasRqData m, Monoid w) => HasRqData (RWST r w s m) | |
Defined in Happstack.Server.RqData Methods askRqEnv :: RWST r w s m RqEnv # localRqEnv :: (RqEnv -> RqEnv) -> RWST r w s m a -> RWST r w s m a # rqDataError :: Errors String -> RWST r w s m a # |
decodeBody :: (ServerMonad m, MonadPlus m, MonadIO m, FilterMonad Response m, WebMonad Response m) => BodyPolicy -> m () #
getData :: (HasRqData m, ServerMonad m, FromData a) => m (Either [String] a) #
getDataFn :: (HasRqData m, ServerMonad m) => RqData a -> m (Either [String] a) #
lookCookie :: (Monad m, HasRqData m) => String -> m Cookie #
lookCookieValue :: (Functor m, Monad m, HasRqData m) => String -> m String #
lookFile :: (Monad m, HasRqData m) => String -> m (FilePath, FilePath, ContentType) #
lookInputs :: (Monad m, HasRqData m) => String -> m [Input] #
lookPairsBS :: (Monad m, HasRqData m) => m [(String, Either FilePath ByteString)] #
lookRead :: (Functor m, Monad m, HasRqData m, FromReqURI a) => String -> m a #
lookReads :: (Functor m, Monad m, HasRqData m, FromReqURI a) => String -> m [a] #
lookTexts' :: (Functor m, Monad m, HasRqData m) => String -> m [Text] #
queryString :: HasRqData m => m a -> m a #
readCookieValue :: (Functor m, Monad m, HasRqData m, FromReqURI a) => String -> m a #
readRq :: FromReqURI a => String -> String -> Either String a #
unsafeReadRq :: Read a => String -> String -> Either String a #
withData :: (HasRqData m, FromData a, MonadPlus m, ServerMonad m) => (a -> m r) -> m r #
withDataFn :: (HasRqData m, MonadPlus m, ServerMonad m) => RqData a -> (a -> m r) -> m r #
parseConfig :: [String] -> Either [String] Conf #
simpleHTTP' :: (ToMessage b, Monad m, Functor m) => (UnWebT m a -> UnWebT IO b) -> Conf -> ServerPartT m a -> IO () #
simpleHTTP'' :: (ToMessage b, Monad m, Functor m) => ServerPartT m b -> Request -> m Response #
simpleHTTPWithSocket :: ToMessage a => Socket -> Conf -> ServerPartT IO a -> IO () #
simpleHTTPWithSocket' :: (ToMessage b, Monad m, Functor m) => (UnWebT m a -> UnWebT IO b) -> Socket -> Conf -> ServerPartT m a -> IO () #
waitForTermination :: IO () #
lazyProcValidator :: FilePath -> [String] -> Maybe FilePath -> Maybe [(String, String)] -> (Maybe ByteString -> Bool) -> Response -> IO Response #
noopValidator :: Response -> IO Response #
validateConf :: Conf #
wdgHTMLValidator :: (MonadIO m, ToMessage r) => r -> m Response #
withExpiresHeaders :: ServerMonad m => m Response -> m Response Source #
setContentType :: String -> Response -> Response Source #
setFilename :: String -> Response -> Response Source #
lookupIPAddr :: String -> IO (Maybe String) Source #
getHost :: ServerMonad m => m (Maybe String) Source #
compressedResponseFilter :: (FilterMonad Response m, MonadPlus m, WebMonad Response m, ServerMonad m, MonadFail m) => m String #