{-# LANGUAGE FlexibleContexts, FlexibleInstances, ForeignFunctionInterface, GeneralizedNewtypeDeriving, MonoLocalBinds, MultiParamTypeClasses, ScopedTypeVariables, TypeSynonymInstances, UndecidableInstances #-}
---------- GENERATED FILE, EDITS WILL BE LOST ----------

{-# LANGUAGE NoMonomorphismRestriction #-}

module Graphics.UI.Qtah.Widgets.QGraphicsRectItem (
  QGraphicsRectItemValue (..),
  QGraphicsRectItemConstPtr (..),
  QGraphicsRectItemPtr (..),
  QGraphicsRectItemConst,
  QGraphicsRectItem,
  castConst,
  cast,
  downCastConst,
  downCast,
  new,
  newWithRaw,
  rect,
  setRectRaw,
  ) where

import Graphics.UI.Qtah.Generated.Widgets.QGraphicsRectItem
import Prelude ()


castConst = toQGraphicsRectItemConst
cast = toQGraphicsRectItem
downCastConst = downToQGraphicsRectItemConst
downCast = downToQGraphicsRectItem