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