{-# LANGUAGE MultiParamTypeClasses #-}

module CsoundExpr.Translator.Cs.IM (IM(..)) 
where

class IM a b where
    from :: a -> b
    to   :: b -> a