{-# LANGUAGE NoImplicitPrelude #-} {-# LANGUAGE FlexibleInstances #-} module Data.Aviation.Units.Pounds( Pounds(pounds) ) where import Control.Category(id) import Control.Lens(Iso') import Prelude(Rational) class Pounds a where pounds :: Iso' Rational a instance Pounds Rational where pounds :: p Rational (f Rational) -> p Rational (f Rational) pounds = p Rational (f Rational) -> p Rational (f Rational) forall k (cat :: k -> k -> *) (a :: k). Category cat => cat a a id