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

Safe HaskellNone
LanguageHaskell2010

OpenCV.Core.Types.Point

Contents

Documentation

data Point (dim :: Nat) (depth :: *) Source #

Instances

(IsPoint V2 a, Show a) => Show (Point 2 a) Source # 

Methods

showsPrec :: Int -> Point 2 a -> ShowS #

show :: Point 2 a -> String #

showList :: [Point 2 a] -> ShowS #

(IsPoint V3 a, Show a) => Show (Point 3 a) Source # 

Methods

showsPrec :: Int -> Point 3 a -> ShowS #

show :: Point 3 a -> String #

showList :: [Point 3 a] -> ShowS #

WithPtr (Point dim depth) Source # 

Methods

withPtr :: Point dim depth -> (Ptr (C (Point dim depth)) -> IO b) -> IO b

type PointDim (Point dim) Source # 
type PointDim (Point dim) = dim

type family PointDim (v :: * -> *) :: Nat Source #

Instances

type PointDim V3 Source # 
type PointDim V3 = 3
type PointDim V2 Source # 
type PointDim V2 = 2
type PointDim (Point dim) Source # 
type PointDim (Point dim) = dim

class IsPoint (p :: * -> *) (depth :: *) where Source #

Minimal complete definition

toPoint, fromPoint

Methods

toPoint :: p depth -> Point (PointDim p) depth Source #

fromPoint :: Point (PointDim p) depth -> p depth Source #

toPointIO :: p depth -> IO (Point (PointDim p) depth) Source #

type IsPoint2 p depth = (IsPoint p depth, PointDim p ~ 2) Source #

type IsPoint3 p depth = (IsPoint p depth, PointDim p ~ 3) Source #

Orphan instances

FromPtr Point2i Source # 

Methods

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

FromPtr Point2f Source # 

Methods

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

FromPtr Point2d Source # 

Methods

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

FromPtr Point3i Source # 

Methods

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

FromPtr Point3f Source # 

Methods

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

FromPtr Point3d Source # 

Methods

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

IsPoint V3 Int32 Source # 
IsPoint V3 CFloat Source # 
IsPoint V3 CDouble Source # 
IsPoint V2 Int32 Source # 
IsPoint V2 CFloat Source # 
IsPoint V2 CDouble Source # 
IsPoint (Point 2) Int32 Source # 
IsPoint (Point 2) CFloat Source # 
IsPoint (Point 2) CDouble Source # 
IsPoint (Point 3) Int32 Source # 
IsPoint (Point 3) CFloat Source # 
IsPoint (Point 3) CDouble Source #