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

{-# LANGUAGE NoMonomorphismRestriction #-}

module Graphics.UI.Qtah.Core.QPersistentModelIndex (
  QPersistentModelIndexValue (..),
  QPersistentModelIndexConstPtr (..),
  QPersistentModelIndexPtr (..),
  QPersistentModelIndexConst,
  QPersistentModelIndex,
  castConst,
  cast,
  downCastConst,
  downCast,
  decode,
  new,
  newCopy,
  newFromIndex,
  aSSIGN,
  child,
  column,
  eQ,
  flags,
  getData,
  getDataWithRole,
  isValid,
  model,
  nE,
  parent,
  row,
  sibling,
  swap,
  ) where

import qualified Foreign.Hoppy.Runtime as QtahFHR
import Graphics.UI.Qtah.Generated.Core.QPersistentModelIndex
import qualified Graphics.UI.Qtah.Generated.Core.QPersistentModelIndex as M38
import Prelude ()
import qualified Prelude as QtahP


castConst = toQPersistentModelIndexConst
cast = toQPersistentModelIndex
downCastConst = downToQPersistentModelIndexConst
downCast = downToQPersistentModelIndex

decode :: (QPersistentModelIndexConstPtr this) => this -> QtahP.IO M38.QPersistentModelIndex
decode = QtahFHR.decode QtahP.. toQPersistentModelIndexConst