haskore-0.1: The Haskore Computer Music SystemSource codeContentsIndex
Haskore.Interface.CSound.TutorialCustom
Documentation
lineCS :: EvalRate -> SigExp -> SigExp -> SigExp -> SigExpSource
pureToneTN :: TableSource
pureToneTable :: SigExpSource
pureTone :: StatementSource
oscPure :: SigExp -> SigExp -> SigExpSource
type TutMelody params = T (TutAttr params)Source
data TutAttr params Source
Constructors
TutAttr
attrVelocity :: Rational
attrParameters :: params
tune1 :: TutMelody ()Source
data Instrument Source
Constructors
Instr1p0
Instr2p0
Instr1p2 Float Float
Instr1p4 Float Float Float Float
show/hide Instances
musicFromMelody :: (params -> Instrument) -> TutMelody params -> T () InstrumentSource
type Pair = (Float, Float)Source
type Quadruple = (Float, Float, Float, Float)Source
attrToInstr1p0 :: () -> InstrumentSource
attrToInstr2p0 :: () -> InstrumentSource
attrToInstr1p2 :: Pair -> InstrumentSource
attrToInstr1p4 :: Quadruple -> InstrumentSource
performanceFromMusic :: T () Instrument -> T Float Float (Note () Instrument)Source
instrNum2 :: InstrumentSource
instrNum1 :: InstrumentSource
instrToNum :: Instrument -> ([PField], Instrument)Source
scoreFromPerformance :: TutOrchestra out -> T Float Float (Note () Instrument) -> TSource
data OutFunc out Source
Constructors
OutFunc0 out
OutFunc2 (SigExp -> SigExp -> out)
OutFunc4 (SigExp -> SigExp -> SigExp -> SigExp -> out)
type TutOrchestra out = (Header, [(Instrument, OutFunc out)])Source
matchInstrOutFunc :: Instrument -> OutFunc out -> BoolSource
scoreFromPerformanceSafe :: TutOrchestra out -> T Float Float (Note () Instrument) -> TSource
scored :: TutOrchestra out -> (params -> Instrument) -> TutMelody params -> TSource
example :: Name -> (TutOrchestra out -> T) -> TutOrchestra out -> (Name, T, TutOrchestra out)Source
oe1 :: MonoSource
hdr :: HeaderSource
o2 :: TutOrchestra MonoSource
o3 :: TutOrchestra MonoSource
o4 :: TutOrchestra MonoSource
o7 :: TutOrchestra MonoSource
o8 :: TutOrchestra MonoSource
o9 :: TutOrchestra MonoSource
o13 :: TutOrchestra MonoSource
o14 :: TutOrchestra MonoSource
o15 :: TutOrchestra MonoSource
o19 :: TutOrchestra MonoSource
o22 :: TutOrchestra MonoSource
o1 :: TutOrchestra MonoSource
o6 :: TutOrchestra StereoSource
o10 :: TutOrchestra StereoSource
o11 :: TutOrchestra StereoSource
o12 :: TutOrchestra StereoSource
o16 :: TutOrchestra StereoSource
o17 :: TutOrchestra StereoSource
o18 :: TutOrchestra StereoSource
o20 :: TutOrchestra StereoSource
o21 :: TutOrchestra StereoSource
o5 :: TutOrchestra StereoSource
tut2 :: (Name, T, TutOrchestra Mono)Source
tut3 :: (Name, T, TutOrchestra Mono)Source
tut4 :: (Name, T, TutOrchestra Mono)Source
tut7 :: (Name, T, TutOrchestra Mono)Source
tut8 :: (Name, T, TutOrchestra Mono)Source
tut9 :: (Name, T, TutOrchestra Mono)Source
tut13 :: (Name, T, TutOrchestra Mono)Source
tut14 :: (Name, T, TutOrchestra Mono)Source
tut15 :: (Name, T, TutOrchestra Mono)Source
tut19 :: (Name, T, TutOrchestra Mono)Source
tut22 :: (Name, T, TutOrchestra Mono)Source
tut1 :: (Name, T, TutOrchestra Mono)Source
tut6 :: (Name, T, TutOrchestra Stereo)Source
tut10 :: (Name, T, TutOrchestra Stereo)Source
tut11 :: (Name, T, TutOrchestra Stereo)Source
tut12 :: (Name, T, TutOrchestra Stereo)Source
tut16 :: (Name, T, TutOrchestra Stereo)Source
tut17 :: (Name, T, TutOrchestra Stereo)Source
tut18 :: (Name, T, TutOrchestra Stereo)Source
tut20 :: (Name, T, TutOrchestra Stereo)Source
tut21 :: (Name, T, TutOrchestra Stereo)Source
tut5 :: (Name, T, TutOrchestra Stereo)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
score1 :: TutOrchestra out -> [Statement]Source
csoundDir :: NameSource
twoHarmsTN :: TableSource
twoHarms :: StatementSource
oe2 :: MonoSource
manySinesTN :: TableSource
manySinesTable :: SigExpSource
manySines :: StatementSource
oe3 :: MonoSource
oe4 :: MonoSource
coolEnvTN :: TableSource
coolEnvTable :: SigExpSource
coolEnv :: StatementSource
oscCoolEnv :: SigExp -> SigExp -> SigExpSource
tune2 :: TutMelody PairSource
squareTN :: TableSource
sawtoothTN :: TableSource
triangleTN :: TableSource
squareT :: StatementSource
sawtoothT :: StatementSource
triangleT :: StatementSource
oe5 :: SigExp -> SigExp -> StereoSource
oe6 :: StereoSource
oe7 :: StereoSource
oe8 :: MonoSource
oe9 :: MonoSource
oe10 :: MonoSource
oe11 :: SigExp -> SigExp -> SigExp -> SigExp -> StereoSource
cChord :: Float -> Float -> Float -> Float -> TutMelody QuadrupleSource
gChord :: Float -> Float -> Float -> Float -> TutMelody QuadrupleSource
dChord :: Float -> Float -> Float -> Float -> TutMelody QuadrupleSource
emChord :: Float -> Float -> Float -> Float -> TutMelody QuadrupleSource
quickChord :: [Dur -> TutAttr Quadruple -> TutMelody Quadruple] -> Float -> Float -> Float -> Float -> TutMelody QuadrupleSource
tune3 :: TutMelody QuadrupleSource
oe12 :: SigExp -> SigExp -> SigExp -> SigExp -> StereoSource
oe13 :: SigExp -> SigExp -> SigExp -> SigExp -> StereoSource
oe14 :: MonoSource
oe15 :: MonoSource
oe16 :: MonoSource
midHumpTN :: TableSource
midHump :: StatementSource
oe17 :: StereoSource
ping :: SigExpSource
oe18 :: StereoSource
oe19 :: StereoSource
oe20 :: MonoSource
oe21 :: SigExp -> SigExp -> SigExp -> SigExp -> StereoSource
highPass :: EvalRate -> SigExp -> SigExp -> SigExpSource
lowPass :: EvalRate -> SigExp -> SigExp -> SigExpSource
oe22 :: StereoSource
oe23 :: MonoSource
test :: Output out => (Name, T, TutOrchestra out) -> IO ()Source
applyOutFunc :: OutFunc out -> outSource
toOrchestra :: Output out => TutOrchestra out -> T outSource
play :: Output out => FilePath -> (Name, T, TutOrchestra out) -> IO ()Source
reedy :: (Name, T, TutOrchestra Mono)Source
flute :: (Name, T, TutOrchestra Mono)Source
piano :: (Name, T, TutOrchestra Mono)Source
reedyOrc :: TutOrchestra MonoSource
fluteOrc :: TutOrchestra MonoSource
pianoOrc :: TutOrchestra MonoSource
reedyScore :: TutOrchestra out -> TSource
fluteScore :: TutOrchestra out -> TSource
pianoScore :: TutOrchestra out -> TSource
reedyEnv :: StatementSource
fluteEnv :: StatementSource
pianoWave :: StatementSource
reedyWave :: StatementSource
fluteWave :: StatementSource
pianoEnv :: StatementSource
reedyEnvTN :: TableSource
fluteEnvTN :: TableSource
pianoWaveTN :: TableSource
reedyWaveTN :: TableSource
fluteWaveTN :: TableSource
pianoEnvTN :: TableSource
reedyEnvTable :: SigExpSource
fluteEnvTable :: SigExpSource
pianoWaveTable :: SigExpSource
reedyWaveTable :: SigExpSource
fluteWaveTable :: SigExpSource
pianoEnvTable :: SigExpSource
pianoOE :: MonoSource
reedyOE :: MonoSource
reedy2OE :: StereoSource
reedy2Orc :: TutOrchestra StereoSource
reedy2 :: (Name, T, TutOrchestra Stereo)Source
fluteTune :: TutMelody PairSource
fluteOE :: SigExp -> SigExp -> MonoSource
voice' :: SigExp -> SigExp -> SigExp -> SigExp -> SigExp -> SigExp -> SigExp -> SigExp -> SigExpSource
data Phoneme Source
Constructors
Eee
Ihh
Ehh
Aaa
Ahh
Aww
Ohh
Uhh
Uuu
Ooo
Rrr
Lll
Mmm
Nnn
Nng
Ngg
Fff
Sss
Thh
Shh
Xxx
Hee
Hoo
Hah
Bbb
Ddd
Jjj
Ggg
Vvv
Zzz
Thz
Zhh
show/hide Instances
voiceTune :: TutMelody PairSource
voiceWaveTN :: TableSource
voiceVibWaveTN :: TableSource
voiceWaveTable :: SigExpSource
voiceVibWaveTable :: SigExpSource
voiceVibWave :: StatementSource
voiceWave :: StatementSource
voiceScore :: TutOrchestra out -> TSource
voiceOE :: SigExp -> SigExp -> MonoSource
voiceOrc :: TutOrchestra MonoSource
voice :: (Name, T, TutOrchestra Mono)Source
Produced by Haddock version 2.4.2