Right
base Prelude Data.Either,
hedgehog Hedgehog.Internal.Prelude,
ghc GHC.Prelude.Basic,
base-compat Prelude.Compat,
strict Data.Strict.Either,
relude Relude.Monad.Reexport,
rio RIO.Prelude.Types,
base-prelude BasePrelude BasePrelude.DataTypes,
classy-prelude ClassyPrelude,
numeric-prelude NumericPrelude NumericPrelude.Base,
Cabal-syntax Distribution.Compat.Prelude,
basic-prelude CorePrelude,
universum Universum.Monad.Reexport,
ihaskell IHaskellPrelude,
basement Basement.Compat.Base Basement.Imports,
numhask NumHask.Prelude,
clash-prelude Clash.HaskellPrelude,
github GitHub.Internal.Prelude,
foundation Foundation,
ghc-lib-parser GHC.Prelude.Basic,
prelude-compat Prelude2010,
dimensional Numeric.Units.Dimensional.Prelude,
ghc-internal GHC.Internal.Data.Either,
rebase Rebase.Prelude,
hledger Hledger.Cli.Script,
mixed-types-num Numeric.MixedTypes.PreludeHiding,
xmonad-contrib XMonad.Config.Prime,
yaya Yaya.Pattern,
constrained-categories Control.Category.Constrained.Prelude Control.Category.Hask,
copilot-language Copilot.Language.Prelude,
LambdaHack Game.LambdaHack.Core.Prelude,
cabal-install-solver Distribution.Solver.Compat.Prelude,
faktory Faktory.Prelude,
strict-base-types Data.Either.Strict,
vcr Imports,
verset Verset,
yesod-paginator Yesod.Paginator.Prelude,
distribution-opensuse OpenSuse.Prelude,
hledger-web Hledger.Web.Import,
termonad Termonad.Prelude A mirror image of
left.
The default definition may be overridden with a more efficient version
if desired.
The right sibling of the given location.
Move one step right from the current position.
Pad the right hand side of a string until it reaches k characters
wide, if necessary filling with character c.
Pad the right hand side of a string until it reaches k
characters wide, if necessary filling with character c.
Align boxes to the right.
Moves a
Cursor to its right sibling.
right :: Prism (Either r a) (Either r b) a b
A prism on the
Right element of an
Either.
The right sibling of the given location - pure version.
Assert that some value is Right.
right z returns the zipper with the focus shifted right one
element; this can move the cursor off the end.