-- | (Undocumented class)
module Sound.SC3.UGen.Record.RPlayTrace where
import qualified Sound.SC3.UGen as S
import Sound.SC3.UGen.Record
data RPlayTrace = RPlayTrace {
  rate :: S.Rate,
  bufnum :: S.UGen,
  degree :: S.UGen,
  rate_ :: S.UGen,
  axis :: S.UGen
  } deriving (Show)
rPlayTrace :: RPlayTrace
rPlayTrace = RPlayTrace {
  rate = S.AR,
  bufnum = 0.0,
  degree = 4.0,
  rate_ = 0.0,
  axis = 1.0
  }
mkRPlayTrace :: RPlayTrace -> S.UGen
mkRPlayTrace (RPlayTrace r a' b' c' d') = S.mkOsc r "RPlayTrace" [a',b',c',d'] 1
instance Make RPlayTrace where
  ugen = mkRPlayTrace