module Cursor.Brick.List where

import Brick.Types
import Cursor.List

listCursorWidgetM ::
  ([a] -> [a] -> m (Widget n)) -> ListCursor a -> m (Widget n)
listCursorWidgetM :: ([a] -> [a] -> m (Widget n)) -> ListCursor a -> m (Widget n)
listCursorWidgetM = ([a] -> [a] -> m (Widget n)) -> ListCursor a -> m (Widget n)
forall a b. ([a] -> [a] -> b) -> ListCursor a -> b
foldListCursor

listCursorWidget :: ([a] -> [a] -> Widget n) -> ListCursor a -> Widget n
listCursorWidget :: ([a] -> [a] -> Widget n) -> ListCursor a -> Widget n
listCursorWidget = ([a] -> [a] -> Widget n) -> ListCursor a -> Widget n
forall a b. ([a] -> [a] -> b) -> ListCursor a -> b
foldListCursor