module Control.Combine.SmallCheck where

import Control.Combine as C
import Data.Type.Nat as N
import Test.SmallCheck as SC

prop_rot2_works a b c = rot N.two (,,) a b c == (b, c, a)
    where types = (a :: Bool, b :: Bool, c :: Bool)

-- vim: expandtab:tabstop=4:shiftwidth=4