Hoogle Search

Within LTS Haskell 24.19 (ghc-9.10.3)

Note that Stackage only displays results for the latest LTS and Nightly snapshot. Learn more.

  1. imapM_ :: (Monad m, Unbox a) => (Int -> a -> m b) -> Vector a -> m ()

    rio RIO.Vector.Unboxed

    No documentation available.

  2. imapMaybe :: (Unbox a, Unbox b) => (Int -> a -> Maybe b) -> Vector a -> Vector b

    rio RIO.Vector.Unboxed

    No documentation available.

  3. imapM :: (TraversableWithIndex i t, Monad m) => (i -> a -> m b) -> t a -> m (t b)

    diagrams-lib Diagrams.Prelude

    Map each element of a structure to a monadic action, evaluate these actions from left to right, and collect the results, with access the index. When you don't need access to the index mapM is more liberal in what it can accept.

    mapMimapM . const
    

  4. imapMOf :: Over (Indexed i) (WrappedMonad m) s t a b -> (i -> a -> m b) -> s -> m t

    diagrams-lib Diagrams.Prelude

    Map each element of a structure targeted by a Lens to a monadic action, evaluate these actions from left to right, and collect the results, with access its position. When you don't need access to the index mapMOf is more liberal in what it can accept.

    mapMOf l ≡ imapMOf l . const
    
    imapMOf :: Monad m => IndexedLens       i s t a b -> (i -> a -> m b) -> s -> m t
    imapMOf :: Monad m => IndexedTraversal  i s t a b -> (i -> a -> m b) -> s -> m t
    imapMOf :: Bind  m => IndexedTraversal1 i s t a b -> (i -> a -> m b) -> s -> m t
    

  5. imapMOf_ :: Monad m => IndexedGetting i (Sequenced r m) s a -> (i -> a -> m r) -> s -> m ()

    diagrams-lib Diagrams.Prelude

    Run monadic actions for each target of an IndexedFold or IndexedTraversal with access to the index, discarding the results. When you don't need access to the index then mapMOf_ is more flexible in what it accepts.

    mapMOf_ l ≡ imapMOf l . const
    
    imapMOf_ :: Monad m => IndexedGetter i s a     -> (i -> a -> m r) -> s -> m ()
    imapMOf_ :: Monad m => IndexedFold i s a       -> (i -> a -> m r) -> s -> m ()
    imapMOf_ :: Monad m => IndexedLens' i s a      -> (i -> a -> m r) -> s -> m ()
    imapMOf_ :: Monad m => IndexedTraversal' i s a -> (i -> a -> m r) -> s -> m ()
    

  6. imapM_ :: (FoldableWithIndex i t, Monad m) => (i -> a -> m b) -> t a -> m ()

    diagrams-lib Diagrams.Prelude

    Run monadic actions for each target of an IndexedFold or IndexedTraversal with access to the index, discarding the results. When you don't need access to the index then mapMOf_ is more flexible in what it accepts.

    mapM_imapM . const
    

  7. imapMProp :: (IsList c, IsList d, Eq d, Show d, Show b, Item c ~ a, Item d ~ b, Arbitrary c, Arbitrary b, Show c, Show a, CoArbitrary a, Function a) => Proxy a -> Proxy b -> (forall s . () => (Int -> a -> ST s b) -> c -> ST s d) -> Property

    quickcheck-classes-base Test.QuickCheck.Classes.Base.IsList

    No documentation available.

  8. type NodeMapM a b (g :: Type -> Type -> Type) r = State (NodeMap a, g a b) r

    fgl Data.Graph.Inductive.NodeMap

    Graph construction monad; handles passing both the NodeMap and the Graph.

  9. foldMapM :: (Monoid b, Monad m, Foldable f) => (a -> m b) -> f a -> m b

    relude Relude.Foldable.Fold

    Polymorphic version of the concatMapM function.

    >>> foldMapM @[Int] (Just . replicate 3) [1..3]
    Just [1,1,1,2,2,2,3,3,3]
    

  10. class RecMapMethod (c :: Type -> Constraint) (f :: u -> Type) (ts :: [u])

    vinyl Data.Vinyl

    Apply a typeclass method to each field of a Rec where the class constrains the index of the field, but not its interpretation functor.

Page 73 of many | Previous | Next