| type T = [Statement] |
|
|
|
| type Bpm = Int |
|
| type StartTime = Float |
|
| type Duration = Float |
|
|
|
| type Volume = Float |
|
| type Pfield = Float |
|
| type Table = Int |
|
| type CreatTime = Float |
|
| type TableSize = Int |
|
| type Normalize = Bool |
|
|
|
| type SFName = String |
|
| type SkipTime = Float |
|
| type ChanNum = Float |
|
| type GenNum = Int |
|
| type GenArg = Float |
|
| soundFile :: SFName -> SkipTime -> ChanNum -> GenRoutine |
|
| tableValues :: [GenArg] -> GenRoutine |
|
| polynomial :: Interval -> Coefficients -> GenRoutine |
|
| type Interval = (Float, Float) |
|
| type Coefficients = [Float] |
|
| exponential1 :: StartPt -> [(SegLength, EndPt)] -> GenRoutine |
|
| type StartPt = Float |
|
| type SegLength = Float |
|
| type EndPt = Float |
|
| exponential2 :: [Point] -> GenRoutine |
|
| type Point = (Float, Float) |
|
| cubic :: StartPt -> [(SegLength, EndPt)] -> GenRoutine |
|
| lineSeg1 :: StartPt -> [(SegLength, EndPt)] -> GenRoutine |
|
| lineSeg2 :: [Point] -> GenRoutine |
|
| cubicSpline :: StartPt -> [(SegLength, EndPt)] -> GenRoutine |
|
| compSine1 :: [PStrength] -> GenRoutine |
|
| type PStrength = Float |
|
| compSine2 :: [(PNum, PStrength, PhaseOffset)] -> GenRoutine |
|
| type PNum = Float |
|
| type PhaseOffset = Float |
|
| compSine3 :: [(PNum, PStrength, PhaseOffset, DCOffset)] -> GenRoutine |
|
| type DCOffset = Float |
|
| cosineHarms :: NHarms -> LowestHarm -> Mult -> GenRoutine |
|
| type NHarms = Int |
|
| type LowestHarm = Int |
|
| type Mult = Float |
|
| randomTable :: RandDist -> GenRoutine |
|
| type RandDist = Int |
|
| uniform :: Int |
|
| linear :: Int |
|
| triangular :: Int |
|
| expon :: Int |
|
| biexpon :: Int |
|
| gaussian :: Int |
|
| cauchy :: Int |
|
| posCauchy :: Int |
|
| simpleSine :: Table -> Statement |
|
| square :: Table -> Statement |
|
| sawtooth :: Table -> Statement |
|
| triangle :: Table -> Statement |
|
| whiteNoise :: Table -> Statement |
|
| compSine :: Table -> [PStrength] -> Statement |
|
| type NameMap = [(Name, Int)] |
|
| makeNameMap :: [Name] -> NameMap |
|
| addToMap :: NameMap -> Name -> Int -> NameMap |
|
| getId :: NameMap -> Name -> Maybe Int |
|
| fromPerformance :: NameMap -> T -> T |
|
| saveIA :: T -> IO () |
|
| fromMusic :: NameMap -> Map -> Tables -> Context -> T -> IO () |
|
| type Tables = T |
|
| statementFromEvent :: NameMap -> StartTime -> Event -> Statement |
|
| velocityToDb :: Float -> Float |
|
| amplitudeToDb :: Float -> Float |
|
| save :: FilePath -> T -> IO () |
|
| toString :: T -> String |
|
| listToString :: [Float] -> String |
|
| statementToString :: Statement -> String |
|
| zeroKey :: Int |
|
| pchToString :: Pch -> String |