BiobaseTypes-0.2.0.1: Collection of types for bioinformatics
Biobase.Types.Index.Type
newtype Index (t :: Nat) Source #
A linear Int-based index type.
Int
Constructors
Fields
Defined in Biobase.Types.Index.Type
Methods
basicUnsafeFreeze :: PrimMonad m => Mutable Vector (PrimState m) (Index t) -> m (Vector (Index t)) #
basicUnsafeThaw :: PrimMonad m => Vector (Index t) -> m (Mutable Vector (PrimState m) (Index t)) #
basicLength :: Vector (Index t) -> Int #
basicUnsafeSlice :: Int -> Int -> Vector (Index t) -> Vector (Index t) #
basicUnsafeIndexM :: Monad m => Vector (Index t) -> Int -> m (Index t) #
basicUnsafeCopy :: PrimMonad m => Mutable Vector (PrimState m) (Index t) -> Vector (Index t) -> m () #
elemseq :: Vector (Index t) -> Index t -> b -> b #
basicLength :: MVector s (Index t) -> Int #
basicUnsafeSlice :: Int -> Int -> MVector s (Index t) -> MVector s (Index t) #
basicOverlaps :: MVector s (Index t) -> MVector s (Index t) -> Bool #
basicUnsafeNew :: PrimMonad m => Int -> m (MVector (PrimState m) (Index t)) #
basicInitialize :: PrimMonad m => MVector (PrimState m) (Index t) -> m () #
basicUnsafeReplicate :: PrimMonad m => Int -> Index t -> m (MVector (PrimState m) (Index t)) #
basicUnsafeRead :: PrimMonad m => MVector (PrimState m) (Index t) -> Int -> m (Index t) #
basicUnsafeWrite :: PrimMonad m => MVector (PrimState m) (Index t) -> Int -> Index t -> m () #
basicClear :: PrimMonad m => MVector (PrimState m) (Index t) -> m () #
basicSet :: PrimMonad m => MVector (PrimState m) (Index t) -> Index t -> m () #
basicUnsafeCopy :: PrimMonad m => MVector (PrimState m) (Index t) -> MVector (PrimState m) (Index t) -> m () #
basicUnsafeMove :: PrimMonad m => MVector (PrimState m) (Index t) -> MVector (PrimState m) (Index t) -> m () #
basicUnsafeGrow :: PrimMonad m => MVector (PrimState m) (Index t) -> Int -> m (MVector (PrimState m) (Index t)) #
(==) :: Index t -> Index t -> Bool #
(/=) :: Index t -> Index t -> Bool #
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Index t -> c (Index t) #
gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Index t) #
toConstr :: Index t -> Constr #
dataTypeOf :: Index t -> DataType #
dataCast1 :: Typeable t0 => (forall d. Data d => c (t0 d)) -> Maybe (c (Index t)) #
dataCast2 :: Typeable t0 => (forall d e. (Data d, Data e) => c (t0 d e)) -> Maybe (c (Index t)) #
gmapT :: (forall b. Data b => b -> b) -> Index t -> Index t #
gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Index t -> r #
gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Index t -> r #
gmapQ :: (forall d. Data d => d -> u) -> Index t -> [u] #
gmapQi :: Int -> (forall d. Data d => d -> u) -> Index t -> u #
gmapM :: Monad m => (forall d. Data d => d -> m d) -> Index t -> m (Index t) #
gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Index t -> m (Index t) #
gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Index t -> m (Index t) #
(+) :: Index t -> Index t -> Index t #
(-) :: Index t -> Index t -> Index t #
(*) :: Index t -> Index t -> Index t #
negate :: Index t -> Index t #
abs :: Index t -> Index t #
signum :: Index t -> Index t #
fromInteger :: Integer -> Index t #
compare :: Index t -> Index t -> Ordering #
(<) :: Index t -> Index t -> Bool #
(<=) :: Index t -> Index t -> Bool #
(>) :: Index t -> Index t -> Bool #
(>=) :: Index t -> Index t -> Bool #
max :: Index t -> Index t -> Index t #
min :: Index t -> Index t -> Index t #
readsPrec :: Int -> ReadS (Index t) #
readList :: ReadS [Index t] #
readPrec :: ReadPrec (Index t) #
readListPrec :: ReadPrec [Index t] #
showsPrec :: Int -> Index t -> ShowS #
show :: Index t -> String #
showList :: [Index t] -> ShowS #
range :: (Index t, Index t) -> [Index t] #
index :: (Index t, Index t) -> Index t -> Int #
unsafeIndex :: (Index t, Index t) -> Index t -> Int
inRange :: (Index t, Index t) -> Index t -> Bool #
rangeSize :: (Index t, Index t) -> Int #
unsafeRangeSize :: (Index t, Index t) -> Int
Associated Types
type Rep (Index t) :: Type -> Type #
from :: Index t -> Rep (Index t) x #
to :: Rep (Index t) x -> Index t #
data LimitType (Index t) :: Type #
linearIndex :: LimitType (Index t) -> Index t -> Int #
size :: LimitType (Index t) -> Int #
inBounds :: LimitType (Index t) -> Index t -> Bool #
zeroBound :: Index t #
zeroBound' :: LimitType (Index t) #
totalSize :: LimitType (Index t) -> [Integer] #
streamUp :: Monad m => LimitType (Index t) -> LimitType (Index t) -> Stream m (Index t) #
streamDown :: Monad m => LimitType (Index t) -> LimitType (Index t) -> Stream m (Index t) #
arbitrary :: Gen (Index t) #
shrink :: Index t -> [Index t] #
rnf :: Index t -> () #
hashWithSalt :: Int -> Index t -> Int #
hash :: Index t -> Int #
toJSON :: Index t -> Value #
toEncoding :: Index t -> Encoding #
toJSONList :: [Index t] -> Value #
toEncodingList :: [Index t] -> Encoding #
parseJSON :: Value -> Parser (Index t) #
parseJSONList :: Value -> Parser [Index t] #
put :: Index t -> Put #
get :: Get (Index t) #
putList :: [Index t] -> Put #
put :: Putter (Index t) #
streamUp :: Monad m => LimitType (z :. Index t) -> LimitType (z :. Index t) -> Stream m (z :. Index t) #
streamDown :: Monad m => LimitType (z :. Index t) -> LimitType (z :. Index t) -> Stream m (z :. Index t) #
index :: forall t. KnownNat t => Int -> Index t Source #
Turn an Int into an Index safely.
Index
maybeIndex :: forall t. KnownNat t => Int -> Maybe (Index t) Source #
Produce Just and Index or Nothing.
Just
Nothing