-- | Alternate operators for microlens.
--
-- Since optic operators take precedence in this library, microlens operators need to be given alternate names.
module Brick.Widgets.TabularList.Internal.Lens (
  (^^.)
) where

import Lens.Micro ((^.))

^^. :: s -> Getting a s a -> a
(^^.) = s -> Getting a s a -> a
forall s a. s -> Getting a s a -> a
(^.)
{-# INLINE (^^.) #-}
infixl 8 ^^.