module Data.RangeMin.Common.Combinators (when, unless, (.:), liftM, liftM2, liftM3) where import Control.Monad {-# INLINE (.:) #-} (.:) :: (c -> d) -> (a -> b -> c) -> a -> b -> d (f .: g) a b = f (g a b)