-- | (Undocumented class) module Sound.SC3.UGen.Record.Instruction where import qualified Sound.SC3.UGen as S import Sound.SC3.UGen.Record data Instruction = Instruction { bufnum :: S.UGen } deriving (Show) instruction :: Instruction instruction = Instruction { bufnum = 0.0 } mkInstruction :: Instruction -> S.UGen mkInstruction (Instruction a') = S.mkOsc S.AR "Instruction" [a'] 1 instance Make Instruction where ugen = mkInstruction