-- | (Undocumented class)
module Sound.SC3.UGen.Record.FoaRotate where
import qualified Sound.SC3.UGen as S
import Sound.SC3.UGen.Record
data FoaRotate = FoaRotate {
  input :: S.UGen,
  angle :: S.UGen
  } deriving (Show)
foaRotate :: FoaRotate
foaRotate = FoaRotate {
  input = 0.0,
  angle = 0.0
  }
mkFoaRotate :: FoaRotate -> S.UGen
mkFoaRotate (FoaRotate  a' b') = S.mkOsc S.AR "FoaRotate" [a',b'] 4
instance Make FoaRotate where
  ugen = mkFoaRotate