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