Metadata revisions for ghcjs-websockets-0.3.0.5

Package maintainers and Hackage trustees are allowed to edit certain bits of package metadata after a release, without uploading a new tarball. Note that the tarball itself is never changed, just the metadata that is stored separately. For more information about metadata revisions, please refer to the Hackage Metadata Revisions FAQ.

No. Time User SHA256
-r1 (ghcjs-websockets-0.3.0.5-r1) 2016-10-23T09:28:13Z jle 1901cc0693c96bc77c6484ac202ce8e6302c2eb2eb6b986a054aaaad9901b2ff
  • Changed synopsis from

    GHCJS interface for the Javascript Websocket API
    to
    Deprecated: use ghcjs-base's native websockets

  • Changed description from

    Documentation online at
    <http://mstksg.github.io/ghcjs-websockets/JavaScript-WebSockets.html>
    
    'ghcjs-websockets' aims to provide a clean, idiomatic,
    efficient, low-level, out-of-your-way, bare bones,
    concurrency-aware interface with minimal abstractions
    over the Javascript Websockets API
    <http://www.w3.org/TR/websockets/>,
    inspired by common Haskell idioms found in libraries like
    'io-stream'
    <http://hackage.haskell.org/package/io-streams> and the
    server-side 'websockets'
    <http://hackage.haskell.org/package/websockets> library,
    targeting compilation to Javascript with 'ghcjs'.
    
    The interface asbtracts websockets as simple IO/file
    handles, with additional access to the natively "typed"
    (text vs binary) nature of the Javascript Websockets API.
    There are also convenience functions to directly decode
    serialized data (serialized with 'binary'
    <http://hackage.haskell.org/package/binary>) sent through
    channels.
    
    The library is mostly intended to be a low-level FFI
    library, with the hopes that other, more advanced
    libraries maybe build on the low-level FFI bindings in
    order to provide more advanced and powerful abstractions.
    Most design decisions were made with the intent of
    keeping things as simple as possible in order for future
    libraries to abstract over it.
    
    Most of the necessary functionality is in hopefully in
    'JavaScript.WebSockets'; more of the low-level API is
    exposed in 'JavaScript.WebSockets.Internal' if you need
    it for library construction.
    
    See the 'JavaScript.WebSockets' module for detailed usage
    instructions and examples.
    
    Some examples:
    
    > import Data.Text (unpack)
    >
    > -- A simple echo client, echoing all incoming text data
    > main :: IO ()
    > main = withUrl "ws://my-server.com" $ \conn ->
    >     forever $ do
    >         t <- receiveText conn
    >         putStrLn (unpack t)
    >         sendText conn t
    
    > -- A simple client waiting for connections and outputting the running sum
    > main :: IO ()
    > main = withUrl "ws://my-server.com" (runningSum 0)
    >
    > runningSum :: Int -> Connection -> IO ()
    > runningSum n conn = do
    >     i <- receiveData conn
    >     print (n + i)
    >     runningSum (n + i) conn
    
    > -- Act as a relay between two servers
    > main :: IO ()
    > main = do
    >     conn1 <- openConnection "ws://server-1.com"
    >     conn2 <- openConnection "ws://server-2.com"
    >     forever $ do
    >         msg <- receiveMessage conn1
    >         sendMessage conn2 msg
    >     closeConnection conn2
    >     closeConnection conn1
    to
    Documentation online at
    <http://mstksg.github.io/ghcjs-websockets/JavaScript-WebSockets.html>
    
    Deprecated in favor of ghcjs-base's native websockets.
    
    'ghcjs-websockets' aims to provide a clean, idiomatic,
    efficient, low-level, out-of-your-way, bare bones,
    concurrency-aware interface with minimal abstractions
    over the Javascript Websockets API
    <http://www.w3.org/TR/websockets/>,
    inspired by common Haskell idioms found in libraries like
    'io-stream'
    <http://hackage.haskell.org/package/io-streams> and the
    server-side 'websockets'
    <http://hackage.haskell.org/package/websockets> library,
    targeting compilation to Javascript with 'ghcjs'.
    
    The interface asbtracts websockets as simple IO/file
    handles, with additional access to the natively "typed"
    (text vs binary) nature of the Javascript Websockets API.
    There are also convenience functions to directly decode
    serialized data (serialized with 'binary'
    <http://hackage.haskell.org/package/binary>) sent through
    channels.
    
    The library is mostly intended to be a low-level FFI
    library, with the hopes that other, more advanced
    libraries maybe build on the low-level FFI bindings in
    order to provide more advanced and powerful abstractions.
    Most design decisions were made with the intent of
    keeping things as simple as possible in order for future
    libraries to abstract over it.
    
    Most of the necessary functionality is in hopefully in
    'JavaScript.WebSockets'; more of the low-level API is
    exposed in 'JavaScript.WebSockets.Internal' if you need
    it for library construction.
    
    See the 'JavaScript.WebSockets' module for detailed usage
    instructions and examples.
    
    Some examples:
    
    > import Data.Text (unpack)
    >
    > -- A simple echo client, echoing all incoming text data
    > main :: IO ()
    > main = withUrl "ws://my-server.com" $ \conn ->
    >     forever $ do
    >         t <- receiveText conn
    >         putStrLn (unpack t)
    >         sendText conn t
    
    > -- A simple client waiting for connections and outputting the running sum
    > main :: IO ()
    > main = withUrl "ws://my-server.com" (runningSum 0)
    >
    > runningSum :: Int -> Connection -> IO ()
    > runningSum n conn = do
    >     i <- receiveData conn
    >     print (n + i)
    >     runningSum (n + i) conn
    
    > -- Act as a relay between two servers
    > main :: IO ()
    > main = do
    >     conn1 <- openConnection "ws://server-1.com"
    >     conn2 <- openConnection "ws://server-2.com"
    >     forever $ do
    >         msg <- receiveMessage conn1
    >         sendMessage conn2 msg
    >     closeConnection conn2
    >     closeConnection conn1

-r0 (ghcjs-websockets-0.3.0.5-r0) 2015-08-08T07:25:11Z jle d4c97f2faa4aabb28af776dcda40d9ba3d0ea501174352657705e8315ada452c