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