Safe Haskell | Safe |
---|---|
Language | Haskell2010 |
Documentation
TutAttr | |
|
data Instrument Source
musicFromMelody :: (params -> Instrument) -> TutMelody params -> T () Instrument Source
attrToInstr1p0 :: () -> Instrument Source
attrToInstr2p0 :: () -> Instrument Source
attrToInstr1p2 :: Pair -> Instrument Source
performanceFromMusic :: T () Instrument -> T Float Float (Note () Instrument) Source
instrToNum :: Instrument -> ([PField], Instrument) Source
scoreFromPerformance :: TutOrchestra out -> T Float Float (Note () Instrument) -> T Source
type TutOrchestra out = (Header, [(Instrument, OutFunc out)]) Source
matchInstrOutFunc :: Instrument -> OutFunc out -> Bool Source
scoreFromPerformanceSafe :: TutOrchestra out -> T Float Float (Note () Instrument) -> T Source
scored :: TutOrchestra out -> (params -> Instrument) -> TutMelody params -> T Source
example :: Name -> (TutOrchestra out -> T) -> TutOrchestra out -> (Name, T, TutOrchestra out) Source
o1 :: TutOrchestra Mono Source
o2 :: TutOrchestra Mono Source
o3 :: TutOrchestra Mono Source
o4 :: TutOrchestra Mono Source
o7 :: TutOrchestra Mono Source
o8 :: TutOrchestra Mono Source
o9 :: TutOrchestra Mono Source
score1 :: TutOrchestra out -> [Statement] Source
score2 :: TutOrchestra out -> [Statement] Source
score3 :: TutOrchestra out -> [Statement] Source
score4 :: TutOrchestra out -> [Statement] Source
score5 :: TutOrchestra out -> [Statement] Source
score6 :: TutOrchestra out -> [Statement] Source
score7 :: TutOrchestra out -> [Statement] Source
score8 :: TutOrchestra out -> [Statement] Source
score9 :: TutOrchestra out -> [Statement] Source
oscCoolEnv :: SigExp -> SigExp -> SigExp Source
quickChord :: [Dur -> TutAttr Quadruple -> TutMelody Quadruple] -> Float -> Float -> Float -> Float -> TutMelody Quadruple Source
applyOutFunc :: OutFunc out -> out Source
toOrchestra :: Output out => TutOrchestra out -> T out Source
pianoScore :: TutOrchestra out -> T Source
reedyScore :: TutOrchestra out -> T Source
fluteScore :: TutOrchestra out -> T Source
voice' :: SigExp -> SigExp -> SigExp -> SigExp -> SigExp -> SigExp -> SigExp -> SigExp -> SigExp Source
voiceScore :: TutOrchestra out -> T Source