-- | (Undocumented class) module Sound.SC3.UGen.Record.BBlockerBuf where import qualified Sound.SC3.UGen as S import Sound.SC3.UGen.Record data BBlockerBuf = BBlockerBuf { freq :: S.UGen, bufnum :: S.UGen, startpoint :: S.UGen } deriving (Show) bBlockerBuf :: BBlockerBuf bBlockerBuf = BBlockerBuf { freq = 0.0, bufnum = 0.0, startpoint = 0.0 } mkBBlockerBuf :: BBlockerBuf -> S.UGen mkBBlockerBuf (BBlockerBuf a' b' c') = S.mkOsc S.AR "BBlockerBuf" [a',b',c'] 9 instance Make BBlockerBuf where ugen = mkBBlockerBuf