haskore-0.1.0.2: The Haskore Computer Music SystemSource codeContentsIndex
Haskore.Interface.CSound.Score
Documentation
type T = [Statement]Source
data Statement Source
Constructors
Tempo Bpm
Note Instrument StartTime Duration Pch Volume [PField]
Table Table CreatTime TableSize Normalize T
show/hide Instances
type Bpm = IntSource
type StartTime = TimeSource
type Duration = TimeSource
data Pch Source
Constructors
AbsPch Absolute
Cps Float
show/hide Instances
type Volume = FloatSource
type Table = IntSource
type CreatTime = TimeSource
type TableSize = IntSource
type Normalize = BoolSource
square :: Table -> StatementSource
sawtooth :: Table -> StatementSource
triangle :: Table -> StatementSource
whiteNoise :: Table -> StatementSource
simpleSine :: Table -> StatementSource
compSine :: Table -> [PStrength] -> StatementSource
fromPerformanceBE :: C time => (time -> Time) -> T time T -> TSource
saveIA :: T -> IO ()Source
fromRhythmicMusic :: (RealFrac time, C time, RealFrac dyn, Ord drum, Ord instr) => Tables -> (SoundTable drum, SoundTable instr, T time dyn (Note drum instr), T drum instr) -> TSource
type Tables = TSource
fromRhythmicPerformance :: (RealFrac time, C time, RealFrac dyn, Ord drum, Ord instr) => SoundTable drum -> SoundTable instr -> T time dyn (Note drum instr) -> TSource
fromRhythmicPerformanceMap :: (RealFrac time, C time, RealFrac dyn) => ToSound drum -> ToSound instr -> T time dyn (Note drum instr) -> TSource
fromRhythmicPerformanceWithAttributes :: (RealFrac time, C time, RealFrac dyn) => DrumTableWithAttributes out drum -> InstrumentTableWithAttributes out instr -> T time dyn (Note drum instr) -> TSource
noteToStatement :: (time -> Time) -> time -> time -> T -> StatementSource
save :: FilePath -> T -> IO ()Source
toString :: T -> StringSource
statementToString :: Statement -> StringSource
statementToWords :: Statement -> [String]Source
pchToString :: Pch -> StringSource
Produced by Haddock version 2.7.2