vivid-osc: Open Sound Control encode/decode

[ audio, codec, library, music, sound ] [ Propose Tags ]

A small, simple, and well-tested implementation of the Open Sound Control message format.

Example usage:

{-# LANGUAGE OverloadedStrings #-}
import Network.Socket
import Network.Socket.ByteString as SB

import Vivid.OSC

main = do
   -- Boring Network.Socket setup:
   (a:_) <- getAddrInfo Nothing (Just "127.0.0.1") (Just "57120")
   s <- socket (addrFamily a) Datagram defaultProtocol
   connect s (addrAddress a)

   -- The interesting part:
   SB.send s $ encodeOSC $
      OSC "/play2" [OSC_S "cps", OSC_I 1, OSC_S "s", OSC_S "bd"]

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

  • No Candidates
Versions [RSS] 0.3.0.0, 0.4.0.0, 0.5.0.0
Dependencies base (>3 && <5), binary, bytestring, cereal, time (>=1.2) [details]
License LicenseRef-GPL
Author Tom Murphy
Maintainer Tom Murphy
Category Audio, Codec, Music, Sound
Uploaded by TomMurphy at 2017-08-09T04:29:32Z
Distributions LTSHaskell:0.5.0.0, NixOS:0.5.0.0, Stackage:0.5.0.0
Reverse Dependencies 2 direct, 2 indirect [details]
Downloads 2624 total (26 in the last 30 days)
Rating 2.25 (votes: 2) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs available [build log]
Last success reported on 2017-08-09 [all 1 reports]