{-# LANGUAGE OverloadedStrings #-}

module System.Nemesis.Utils where

import Prelude hiding ((-))

infixr 0 -
{-# INLINE (-) #-}
(-) :: (a -> b) -> a -> b
f - x = f x

ljust :: Int -> a -> [a] -> [a]
ljust n x xs
  | n < length xs = xs
  | otherwise     = take n (xs ++ replicate n x)