module Boopadoop.Example where
import Boopadoop
testProg :: DWave
testProg = sequenceNotes
[((1,2),buildChord [4/4,5/4,6/4] (concertA * semi ** 0))
,((2,3),buildChord [5/5,6/5,7/5] (concertA * semi ** 0))
,((3,4),buildChord [6/6,7/6,8/6] (concertA * semi ** 0))
,((4,5),buildChord [semi ** (-5), semi ** 0, semi ** 4] (concertA * semi ** 7))
]
testDoot :: DWave
testDoot = amplitudeModulate (envelope 0.5 0.15 0 0.25 0.1 3) $ triWave concertA
wackRatio :: DWave
wackRatio = sequenceNotes
[((0,2),sinWave concertA)
,((2,3),buildChord [4/4,5/4,6/4] concertA)
,((3,4),sinWave concertA)
,((4,5),sinWave (concertA * 7 / 4))
,((5,6),buildChord [4/4,7/4] concertA)
,((6,7),buildChord [4/4,5/4,7/4] concertA)
,((7,8),buildChord [4/4,5/4,6/4,7/4] concertA)
]
tripleOscEmulation :: Double -> DWave
tripleOscEmulation f = balanceChord
[sinWave f
,sinWave $ intervalOf (scalePFD (-1) octave) f
,sinWave $ intervalOf (scalePFD (-2) octave) f
]
tiptoeEnvelope :: DWave
tiptoeEnvelope = envelope 0 0.052 0 0.393 0.0418 0.432
tiptoeEmulation :: Double -> DWave
tiptoeEmulation f = amplitudeModulate tiptoeEnvelope $ phaseModulate 0.005 (setVolume 0.2 $ sinWave f) (setVolume 0.38 $ triWave f)
downBeat :: Beat DWave
downBeat = RoseBeat [Beat (sinWave concertA),Rest,Beat (sinWave $ intervalOf perfectFifth concertA)]