-- |
-- Module      :  DobutokO.Sound.Effects.Modulation2
-- Copyright   :  (c) OleksandrZhabenko 2020
-- License     :  MIT
-- Stability   :  Experimental
-- Maintainer  :  olexandr543@yahoo.com
--
-- Helps to create experimental music. 
-- Can be used for applying some of the SoX effects. 
-- 

{-# OPTIONS_GHC -threaded #-}

module DobutokO.Sound.Effects.Modulation2 where


data Modulation = S | T deriving Modulation -> Modulation -> Bool
(Modulation -> Modulation -> Bool)
-> (Modulation -> Modulation -> Bool) -> Eq Modulation
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Modulation -> Modulation -> Bool
$c/= :: Modulation -> Modulation -> Bool
== :: Modulation -> Modulation -> Bool
$c== :: Modulation -> Modulation -> Bool
Eq

instance Show Modulation where
  show :: Modulation -> String
show Modulation
S = String
"-s "
  show Modulation
T = String
"-t "