opencv-0.0.2.1: Haskell binding to OpenCV-3.x

Safe HaskellNone
LanguageHaskell2010

OpenCV.Core.Types.Rect

Contents

Synopsis

Documentation

data Rect (depth :: *) Source #

Instances

(IsRect HRect a, Show a) => Show (Rect a) Source # 

Methods

showsPrec :: Int -> Rect a -> ShowS #

show :: Rect a -> String #

showList :: [Rect a] -> ShowS #

(ToJSON a, IsRect HRect a) => ToJSON (Rect a) Source # 
(FromJSON a, IsRect HRect a) => FromJSON (Rect a) Source # 
WithPtr (Rect depth) Source # 

Methods

withPtr :: Rect depth -> (Ptr (C (Rect depth)) -> IO b) -> IO b

type RectSize Rect Source # 
type RectPoint Rect Source # 

data HRect a Source #

Native Haskell represenation of a rectangle.

Constructors

HRect 

Fields

Instances

Functor HRect Source # 

Methods

fmap :: (a -> b) -> HRect a -> HRect b #

(<$) :: a -> HRect b -> HRect a #

Foldable HRect Source # 

Methods

fold :: Monoid m => HRect m -> m #

foldMap :: Monoid m => (a -> m) -> HRect a -> m #

foldr :: (a -> b -> b) -> b -> HRect a -> b #

foldr' :: (a -> b -> b) -> b -> HRect a -> b #

foldl :: (b -> a -> b) -> b -> HRect a -> b #

foldl' :: (b -> a -> b) -> b -> HRect a -> b #

foldr1 :: (a -> a -> a) -> HRect a -> a #

foldl1 :: (a -> a -> a) -> HRect a -> a #

toList :: HRect a -> [a] #

null :: HRect a -> Bool #

length :: HRect a -> Int #

elem :: Eq a => a -> HRect a -> Bool #

maximum :: Ord a => HRect a -> a #

minimum :: Ord a => HRect a -> a #

sum :: Num a => HRect a -> a #

product :: Num a => HRect a -> a #

Traversable HRect Source # 

Methods

traverse :: Applicative f => (a -> f b) -> HRect a -> f (HRect b) #

sequenceA :: Applicative f => HRect (f a) -> f (HRect a) #

mapM :: Monad m => (a -> m b) -> HRect a -> m (HRect b) #

sequence :: Monad m => HRect (m a) -> m (HRect a) #

Show a => Show (HRect a) Source # 

Methods

showsPrec :: Int -> HRect a -> ShowS #

show :: HRect a -> String #

showList :: [HRect a] -> ShowS #

ToJSON a => ToJSON (HRect a) Source # 
FromJSON a => FromJSON (HRect a) Source # 
type RectSize HRect Source # 
type RectPoint HRect Source # 

type family RectPoint (r :: * -> *) :: * -> * Source #

Instances

type family RectSize (r :: * -> *) :: * -> * Source #

Instances

class IsRect (r :: * -> *) (depth :: *) where Source #

Methods

toRect :: r depth -> Rect depth Source #

fromRect :: Rect depth -> r depth Source #

toRectIO :: r depth -> IO (Rect depth) Source #

rectTopLeft :: r depth -> RectPoint r depth Source #

rectBottomRight :: r depth -> RectPoint r depth Source #

rectSize :: r depth -> RectSize r depth Source #

rectArea :: r depth -> depth Source #

rectContains :: RectPoint r depth -> r depth -> Bool Source #

fmapRect :: forall a b. (IsRect Rect a, IsRect HRect a, IsRect Rect b, IsRect HRect b) => (a -> b) -> Rect a -> Rect b Source #

Orphan instances

FromPtr Rect2i Source # 

Methods

fromPtr :: IO (Ptr (C Rect2i)) -> IO Rect2i

FromPtr Rect2f Source # 

Methods

fromPtr :: IO (Ptr (C Rect2f)) -> IO Rect2f

FromPtr Rect2d Source # 

Methods

fromPtr :: IO (Ptr (C Rect2d)) -> IO Rect2d

IsRect HRect Int32 Source # 
IsRect HRect CFloat Source # 
IsRect HRect CDouble Source # 
IsRect Rect Int32 Source # 
IsRect Rect CFloat Source # 
IsRect Rect CDouble Source #