hsc3-0.20: Haskell SuperCollider
Safe HaskellSafe-Inferred
LanguageHaskell2010

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

Instances details
Show Synthdef Source # 
Instance details

Defined in Sound.Sc3.Server.Synthdef

Eq 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

playAt :: 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 -> Param Source #

Parameter names at Synthdef.

synthdefParam defaultSynthdef == [("amp",0.1),("pan",0),("gate",1),("freq",440),("out",0)]

ugen_to_graphdef :: Ugen -> Graphdef Source #

graph_to_graphdef at Synthdef.

synthdefData :: Synthdef -> ByteString Source #

Encode Synthdef as a binary data stream.

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

Write Synthdef to indicated file.

synthdefWrite_dir :: FilePath -> Synthdef -> 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_wr :: Ugen -> IO () Source #

putStrLn of synthstat.

synthstat_wr 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)

ugen_dump_ugens :: Ugen -> IO () Source #

graphdef_dump_ugens of ugen_to_graphdef