Foreign.Ptr (original) (raw)
Generic1 (URec (Ptr ()) :: k -> Type) Source #
Instance details
Defined in GHC.Generics
Associated Types
type Rep1 (URec (Ptr ())) :: k -> Type Source #
Methods
from1 :: forall (a :: k0). URec (Ptr ()) a -> Rep1 (URec (Ptr ())) a Source #
to1 :: forall (a :: k0). Rep1 (URec (Ptr ())) a -> URec (Ptr ()) a Source #
Data a => Data (Ptr a) Source #
Since: base-4.8.0.0
Instance details
Defined in Data.Data
Methods
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ptr a -> c (Ptr a) Source #
gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Ptr a) Source #
toConstr :: Ptr a -> Constr Source #
dataTypeOf :: Ptr a -> DataType Source #
dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Ptr a)) Source #
dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Ptr a)) Source #
gmapT :: (forall b. Data b => b -> b) -> Ptr a -> Ptr a Source #
gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ptr a -> r Source #
gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ptr a -> r Source #
gmapQ :: (forall d. Data d => d -> u) -> Ptr a -> [u] Source #
gmapQi :: Int -> (forall d. Data d => d -> u) -> Ptr a -> u Source #
gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ptr a -> m (Ptr a) Source #
gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ptr a -> m (Ptr a) Source #
gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ptr a -> m (Ptr a) Source #
Foldable (UAddr :: Type -> Type) Source #
Since: base-4.9.0.0
Instance details
Defined in Data.Foldable
Methods
fold :: Monoid m => UAddr m -> m Source #
foldMap :: Monoid m => (a -> m) -> UAddr a -> m Source #
foldMap' :: Monoid m => (a -> m) -> UAddr a -> m Source #
foldr :: (a -> b -> b) -> b -> UAddr a -> b Source #
foldr' :: (a -> b -> b) -> b -> UAddr a -> b Source #
foldl :: (b -> a -> b) -> b -> UAddr a -> b Source #
foldl' :: (b -> a -> b) -> b -> UAddr a -> b Source #
foldr1 :: (a -> a -> a) -> UAddr a -> a Source #
foldl1 :: (a -> a -> a) -> UAddr a -> a Source #
toList :: UAddr a -> [a] Source #
null :: UAddr a -> Bool Source #
length :: UAddr a -> Int Source #
elem :: Eq a => a -> UAddr a -> Bool Source #
maximum :: Ord a => UAddr a -> a Source #
minimum :: Ord a => UAddr a -> a Source #
sum :: Num a => UAddr a -> a Source #
product :: Num a => UAddr a -> a Source #
Traversable (UAddr :: Type -> Type) Source #
Since: base-4.9.0.0
Instance details
Defined in Data.Traversable
Methods
traverse :: Applicative f => (a -> f b) -> UAddr a -> f (UAddr b) Source #
sequenceA :: Applicative f => UAddr (f a) -> f (UAddr a) Source #
mapM :: Monad m => (a -> m b) -> UAddr a -> m (UAddr b) Source #
sequence :: Monad m => UAddr (m a) -> m (UAddr a) Source #
Since: base-2.1
Instance details
Defined in Foreign.Storable
Methods
sizeOf :: Ptr a -> Int Source #
alignment :: Ptr a -> Int Source #
peekElemOff :: Ptr (Ptr a) -> Int -> IO (Ptr a) Source #
pokeElemOff :: Ptr (Ptr a) -> Int -> Ptr a -> IO () Source #
peekByteOff :: Ptr b -> Int -> IO (Ptr a) Source #
pokeByteOff :: Ptr b -> Int -> Ptr a -> IO () Source #
peek :: Ptr (Ptr a) -> IO (Ptr a) Source #
poke :: Ptr (Ptr a) -> Ptr a -> IO () Source #
Since: base-2.1
Instance details
Defined in GHC.Ptr
Methods
showsPrec :: Int -> Ptr a -> ShowS Source #
show :: Ptr a -> String Source #
showList :: [Ptr a] -> ShowS Source #
Since: base-2.1
Instance details
Defined in GHC.Ptr
Methods
(==) :: Ptr a -> Ptr a -> Bool Source #
(/=) :: Ptr a -> Ptr a -> Bool Source #
Since: base-2.1
Instance details
Defined in GHC.Ptr
Methods
compare :: Ptr a -> Ptr a -> Ordering Source #
(<) :: Ptr a -> Ptr a -> Bool Source #
(<=) :: Ptr a -> Ptr a -> Bool Source #
(>) :: Ptr a -> Ptr a -> Bool Source #
(>=) :: Ptr a -> Ptr a -> Bool Source #
max :: Ptr a -> Ptr a -> Ptr a Source #
min :: Ptr a -> Ptr a -> Ptr a Source #
Functor (URec (Ptr ()) :: Type -> Type) Source #
Since: base-4.9.0.0
Instance details
Defined in GHC.Generics
Methods
fmap :: (a -> b) -> URec (Ptr ()) a -> URec (Ptr ()) b Source #
(<$) :: a -> URec (Ptr ()) b -> URec (Ptr ()) a Source #
Generic (URec (Ptr ()) p) Source #
Instance details
Defined in GHC.Generics
Associated Types
type Rep (URec (Ptr ()) p) :: Type -> Type Source #
Methods
from :: URec (Ptr ()) p -> Rep (URec (Ptr ()) p) x Source #
to :: Rep (URec (Ptr ()) p) x -> URec (Ptr ()) p Source #
Since: base-4.9.0.0
Instance details
Defined in GHC.Generics
Methods
(==) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool Source #
(/=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool Source #
Ord (URec (Ptr ()) p) Source #
Since: base-4.9.0.0
Instance details
Defined in GHC.Generics
Methods
compare :: URec (Ptr ()) p -> URec (Ptr ()) p -> Ordering Source #
(<) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool Source #
(<=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool Source #
(>) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool Source #
(>=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool Source #
max :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p Source #
min :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p Source #
data URec (Ptr ()) (p :: k) Source #
Used for marking occurrences of [Addr#](GHC-Exts.html#t:Addr-35- "GHC.Exts")
Since: base-4.9.0.0
Instance details
Defined in GHC.Generics
data URec (Ptr ()) (p :: k) = UAddr {
- uAddr# :: Addr#
}
type Rep1 (URec (Ptr ()) :: k -> Type) Source #
Since: base-4.9.0.0
Instance details
Defined in GHC.Generics
type Rep1 (URec (Ptr ()) :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UAddr" 'PrefixI 'True) (S1 ('MetaSel ('Just "uAddr#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UAddr :: k -> Type)))
type Rep (URec (Ptr ()) p) Source #
Since: base-4.9.0.0
Instance details
Defined in GHC.Generics
type Rep (URec (Ptr ()) p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UAddr" 'PrefixI 'True) (S1 ('MetaSel ('Just "uAddr#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UAddr :: Type -> Type)))