hsc3-0.17: Haskell SuperCollider

Safe HaskellNone
LanguageHaskell98

Sound.SC3.Server.Synthdef

Description

The unit-generator graph structure implemented by the SuperCollider synthesis server.

Synopsis

Documentation

data Synthdef Source #

A named unit generator graph.

Constructors

Synthdef 
Instances
Eq Synthdef Source # 
Instance details

Defined in Sound.SC3.Server.Synthdef

Show Synthdef Source # 
Instance details

Defined in Sound.SC3.Server.Synthdef

Audible Synthdef Source # 
Instance details

Defined in Sound.SC3.Server.Transport.FD

Methods

play_id :: Transport t => Int -> t -> Synthdef -> IO () Source #

play :: Transport t => t -> Synthdef -> IO () Source #

Audible Synthdef Source # 
Instance details

Defined in Sound.SC3.Server.Transport.Monad

Methods

play_at :: Transport m => Play_Opt -> Synthdef -> m () Source #

play :: Transport m => Synthdef -> m () Source #

defaultSynthdef :: Synthdef Source #

The SC3 default instrument Synthdef, see default_ugen_graph.

import Sound.OSC 
import Sound.SC3 
withSC3 (sendMessage (d_recv defaultSynthdef))
audition defaultSynthdef

defaultSampler :: Bool -> Synthdef Source #

The SC3 default sample (buffer) playback instrument Synthdef, see default_sampler_ugen_graph.

withSC3 (sendMessage (d_recv (defaultSampler False)))
audition (defaultSampler False)

synthdefParam :: Synthdef -> [String] Source #

Parameter names at Synthdef.

synthdefParam defaultSynthdef == ["amp","pan","gate","freq","out"]

synthdefData :: Synthdef -> ByteString Source #

Encode Synthdef as a binary data stream.

synthdefWrite :: Synthdef -> FilePath -> IO () Source #

Write Synthdef to indicated directory. The filename is the synthdefName with the appropriate extension (scsyndef).

synthstat_ln :: UGen -> [String] Source #

graph_stat_ln of synth.

synthstat :: UGen -> String Source #

unlines of synthstat_ln.

putStrLn $ synthstat Sound.SC3.UGen.Help.Graph.default_ugen_graph

synthstat_concise :: UGen -> String Source #

Variant without UGen sequence.

putStrLn $ synthstat_concise (default_sampler_ugen_graph True)