haskore-supercollider-0.0.2: Haskore back-end for SuperColliderSource codeContentsIndex
Haskore.Interface.SuperCollider.Example
Synopsis
latency :: Time
type Song = (String, T)
play :: Song -> IO ()
render :: Song -> IO ()
glissandoStringsUGen :: UGen -> UGen -> UGen
reverb :: UGen -> UGen -> UGen
filterStrings :: Instrument
glissando :: Song
normalizeLevel :: Fractional a => a -> [a] -> [a]
strings :: Instrument
modulatedStrings :: Instrument
brass :: Instrument
sawPerc :: Instrument
sawPercUGen :: UGen -> UGen -> UGen
dynPerc :: UGen -> Instrument
dynPercUGen :: UGen -> UGen -> UGen -> UGen
fmBass :: UGen -> Instrument
fmGuitar :: UGen -> Instrument
xylophone :: Instrument
harpsichord :: Instrument
colorDust :: Double -> Instrument
flangerSquare :: UGen -> UGen
cubicSine :: UGen -> UGen
cubicPhaserSaw :: UGen -> UGen
midiInstrMap :: InstrumentTable Instr
childSong :: Song
bassMusic :: T
bass :: Song
bassFinite :: Song
parabolaOsci :: UGen -> UGen -> UGen
kantate147 :: Song
pad :: UGen -> Instrument
bridge :: UGen -> UGen -> UGen -> [UGen]
zeroUId :: UGenId
hihat :: Drum
bassdrum :: Drum
bassdrumOnk :: Drum
bassdrumPM :: Drum
bassdrumNoisy :: Drum
data Instrument
= SynthBass Double
| Pad Double
data Drum
= Hihat
| BassDrum
instrMap :: InstrumentTableWithAttributes Instrument
drumMap :: DrumTableWithAttributes Drum
synthBassAttrsToInstr :: (Rational, Double) -> (Rational, Instrument)
synthBassMelody :: T (Rational, Double)
padAttrsToInstr :: Double -> (Rational, Instrument)
padMelody :: T Double
rhythm :: T Drum Instrument
chillOutMusic :: T Drum Instrument
chillOut :: Song
chillOutFinite :: Song
data InstrumentTriplet
= SawPerc
| DynPerc Double
sawPercAssign :: InstrumentAssign InstrumentTriplet
dynPercAssign :: InstrumentAssign InstrumentTriplet
tripletsMusic :: T Drum InstrumentTriplet
triplets :: Song
Documentation
latency :: TimeSource
type Song = (String, T)Source
play :: Song -> IO ()Source
render :: Song -> IO ()Source
glissandoStringsUGen :: UGen -> UGen -> UGenSource
reverb :: UGen -> UGen -> UGenSource
filterStrings :: InstrumentSource
glissando :: SongSource
normalizeLevel :: Fractional a => a -> [a] -> [a]Source
normalize a list of numbers, such that they have a specific average
strings :: InstrumentSource
modulatedStrings :: InstrumentSource
brass :: InstrumentSource
sawPerc :: InstrumentSource
sawPercUGen :: UGen -> UGen -> UGenSource
dynPerc :: UGen -> InstrumentSource
dynPercUGen :: UGen -> UGen -> UGen -> UGenSource
fmBass :: UGen -> InstrumentSource
fmGuitar :: UGen -> InstrumentSource
xylophone :: InstrumentSource
harpsichord :: InstrumentSource
colorDust :: Double -> InstrumentSource
The dust UGen as provided by SuperCollider has a problem: The higher the sample rate, the more narrow are the impulses, the less volume you obtain. We work-around this by choosing a larger impulse. (We could also use a fixed width for the impulses.)
flangerSquare :: UGen -> UGenSource
cubicSine :: UGen -> UGenSource
cubicPhaserSaw :: UGen -> UGenSource
midiInstrMap :: InstrumentTable InstrSource
childSong :: SongSource
bassMusic :: TSource
bass :: SongSource
bassFinite :: SongSource
parabolaOsciSource
:: UGenZero means a perfect parabola. The higher the absolute value, the closer is the waveform to a saw.
-> UGenfrequency
-> UGen

Oscillator with the waveform of a parabola.

The parabola is created by moving a saw up or down, and squaring it. That is we repeat the function x -> (x+s)^2.

The crux is the subsequent normalization to zero DC offset. This boils down to a parabola plus a saw.

kantate147 :: SongSource
pad :: UGen -> InstrumentSource
bridge :: UGen -> UGen -> UGen -> [UGen]Source
zeroUId :: UGenIdSource
hihat :: DrumSource
bassdrum :: DrumSource
bassdrumOnk :: DrumSource
bassdrumPM :: DrumSource
bassdrumNoisy :: DrumSource
data Instrument Source
Constructors
SynthBass Double
Pad Double
show/hide Instances
data Drum Source
Constructors
Hihat
BassDrum
show/hide Instances
instrMap :: InstrumentTableWithAttributes InstrumentSource
drumMap :: DrumTableWithAttributes DrumSource
synthBassAttrsToInstr :: (Rational, Double) -> (Rational, Instrument)Source
synthBassMelody :: T (Rational, Double)Source
padAttrsToInstr :: Double -> (Rational, Instrument)Source
padMelody :: T DoubleSource
rhythm :: T Drum InstrumentSource
chillOutMusic :: T Drum InstrumentSource
chillOut :: SongSource
chillOutFinite :: SongSource
data InstrumentTriplet Source
Constructors
SawPerc
DynPerc Double
show/hide Instances
sawPercAssign :: InstrumentAssign InstrumentTripletSource
dynPercAssign :: InstrumentAssign InstrumentTripletSource
tripletsMusic :: T Drum InstrumentTripletSource
triplets :: SongSource
Produced by Haddock version 2.3.0