{-# LANGUAGE NoImplicitPrelude #-}
-- | Silly utility module, used to demonstrate how to write a test
-- case.
module Util
  ( plus2
  ) where

import RIO

plus2 :: Int -> Int
plus2 :: Int -> Int
plus2 = (forall a. Num a => a -> a -> a
+ Int
2)