haskore-0.1: The Haskore Computer Music SystemSource codeContentsIndex
Haskore.Interface.CSound.Generator
Documentation
data T Source
Constructors
Routine Number [Parameter]
SoundFile SFName SkipTime ChanNum
show/hide Instances
type SFName = StringSource
type SkipTime = TimeSource
type ChanNum = FloatSource
type Number = IntSource
type Parameter = FloatSource
soundFile :: SFName -> SkipTime -> ChanNum -> TSource
tableValues :: [Parameter] -> TSource
polynomial :: Interval -> Coefficients -> TSource
type Interval = (Float, Float)Source
type Coefficients = [Float]Source
exponential1 :: StartPt -> [(SegLength, EndPt)] -> TSource
type StartPt = FloatSource
type SegLength = FloatSource
type EndPt = FloatSource
exponential2 :: [Point] -> TSource
type Point = (Float, Float)Source
cubic :: StartPt -> [(SegLength, EndPt)] -> TSource
lineSeg1 :: StartPt -> [(SegLength, EndPt)] -> TSource
lineSeg2 :: [Point] -> TSource
cubicSpline :: StartPt -> [(SegLength, EndPt)] -> TSource
compSine1 :: [PStrength] -> TSource
type PStrength = FloatSource
compSine2 :: [(PNum, PStrength, PhaseOffset)] -> TSource
type PNum = FloatSource
type PhaseOffset = FloatSource
compSine3 :: [(PNum, PStrength, PhaseOffset, DCOffset)] -> TSource
type DCOffset = FloatSource
cosineHarms :: NHarms -> LowestHarm -> Mult -> TSource
type NHarms = IntSource
type LowestHarm = IntSource
type Mult = FloatSource
randomTable :: RandDist -> TSource
data RandDist Source
Constructors
Uniform
Linear
Triangular
Expon
BiExpon
Gaussian
Cauchy
PosCauchy
show/hide Instances
toStatementWords :: T -> [String]Source
Produced by Haddock version 2.4.2