server -package:happstack-server
extracts the tag of the server involved in a given message
InfluxDB server address and port that to interact with.
The hint to install the server job
An implementation of the DoH api that delegates to the local machine's
DNS resolver, using the
resolv package (see
Network.DNS).
Server b' b receives requests of type
b' and sends
responses of type
b.
Servers only
respond and never
request.
This module lets you implement
Servers for defined APIs. You'll
most likely just need
serve.
The Snap HTTP server is a high performance web server library written
in Haskell. Together with the snap-core library upon which it
depends, it provides a clean and efficient Haskell programming
interface to the HTTP protocol.
An object representing a Server.
Server b' b receives requests of type
b' and sends
responses of type
b.
Servers only
respond and
never
request.
HTTP/2 server library.
Example:
{-# LANGUAGE OverloadedStrings #-}
module Main (main) where
import qualified Control.Exception as E
import Data.ByteString.Builder (byteString)
import Network.HTTP.Types (ok200)
import Network.Run.TCP (runTCPServer) -- network-run
import Network.HTTP2.Server
main :: IO ()
main = runTCPServer Nothing "80" runHTTP2Server
where
runHTTP2Server s = E.bracket (allocSimpleConfig s 4096)
freeSimpleConfig
(\config -> run defaultServerConfig config server)
server _req _aux sendResponse = sendResponse response []
where
response = responseBuilder ok200 header body
header = [("Content-Type", "text/plain")]
body = byteString "Hello, world!\n"
A handle that can be used to control the monitoring server. Created by
forkServer.
This module contains the server functionality of XML-RPC. The XML-RPC
specifcation is available at
http://www.xmlrpc.com/spec.
A simple CGI-based XML-RPC server application:
import Network.XmlRpc.Server
add :: Int -> Int -> IO Int
add x y = return (x + y)
main = cgiXmlRpcServer [("examples.add", fun add)]
The Server Portion of the Managed Process API.
Representation of a
Foreign.JavaScript server.
Can be used for dynamic configuration, e.g. serving additional files.
Main entry point into the Hackage Security framework for clients