-- | (Undocumented class) module Sound.SC3.UGen.Record.PV_DiffMags where import qualified Sound.SC3.UGen as S import Sound.SC3.UGen.Record data PV_DiffMags = PV_DiffMags { bufferA :: S.UGen, bufferB :: S.UGen } deriving (Show) pv_DiffMags :: PV_DiffMags pv_DiffMags = PV_DiffMags { bufferA = 0.0, bufferB = 0.0 } mkPV_DiffMags :: PV_DiffMags -> S.UGen mkPV_DiffMags (PV_DiffMags a' b') = S.mkOsc S.KR "PV_DiffMags" [a',b'] 1 instance Make PV_DiffMags where ugen = mkPV_DiffMags