Search results

assure :: forall a e g f. ErrorControl f g e => Monad f => g a -> (a -> Maybe e) -> f a
P purescript-errorcontrol M Error.Control
bind :: forall m a b. Bind m => m a -> (a -> m b) -> m b
P purescript-prelude M Control.Bind
discard :: forall a f b. Discard a => Bind f => f a -> (a -> f b) -> f b
P purescript-prelude M Control.Bind
bind' :: forall v1 v0 m c. HasBind c m => ObjectOf c v0 => ObjectOf c (m v1) => Restrictable Function c => m v0 -> (v0 -> (m v1)) -> m v1
P purescript-subcategory M Control.Subcategory.Functor.HasBind
bind :: forall c b a. HasChain a => a b -> (b -> a c) -> a c

A version of chain with the arguments flipped. This is provided only to support desugaring do notation. It is not recommended to use explicitly.

P purescript-neon M Neon.Helper
fairConjunction :: forall b a m. MonadLogic m => m a -> (a -> m b) -> m b
P purescript-logic M Control.Monad.Logic.Class
hummingbird :: forall m b a. Bind m => m a -> (a -> m b) -> m b

H combinator - hummingbird

BW(BC)

Λ a b c (a → b → a → c) → a → b → c

λ f x y . f x y x

P purescript-birds M Aviary.Birds
when :: forall b a m. MonadLogic m => m a -> (a -> m b) -> m b
P purescript-logic M Control.Monad.Logic.Class
catchError :: forall e m a. MonadError e m => m a -> (e -> m a) -> m a
P purescript-transformers M Control.Monad.Error.Class
controlError :: forall f g e a. ErrorControl f g e => f a -> (e -> g a) -> g a
P purescript-errorcontrol M Error.Control
mapFlipped :: forall f a b. Functor f => f a -> (a -> b) -> f b

mapFlipped is map with its arguments reversed. For example:

[1, 2, 3] <#> \n -> n * n
P purescript-prelude M Data.Functor
flippedMap :: forall f a b. Functor f => f a -> (a -> b) -> f b
P purescript-signal M Signal
delay :: forall m a b. Delay m => a -> (a -> m b) -> m b
P purescript-ffi-simple M FFI.Simple.Functions
fromMaybeS :: forall a f. Selective f => f a -> f (Maybe a) -> f a
P purescript-selective M Control.Selective
fromMaybeS :: forall @f @a. Select f => f a -> f (Maybe a) -> f a

If the second action is Nothing, run and return the first

P purescript-selective-functors M Control.Select
cmapFlipped :: forall a b f. Contravariant f => f a -> (b -> a) -> f b

cmapFlipped is cmap with its arguments reversed.

P purescript-contravariant M Data.Functor.Contravariant
intercept :: forall a e g f. ErrorControl f g e => f a -> (e -> a) -> g a
P purescript-errorcontrol M Error.Control
applyFlipped :: forall a b. a -> (a -> b) -> b

Applies an argument to a function. This is primarily used as the (#) operator, which allows parentheses to be omitted in some cases, or as a natural way to apply a value to a chain of composed functions.

P purescript-prelude M Data.Function
applySecond :: forall a b f. Apply f => f a -> f b -> f b

Combine two effectful actions, keeping only the result of the second.

P purescript-prelude M Control.Apply
voidLeft :: forall f a b. Functor f => f a -> b -> f b

A version of voidRight with its arguments flipped.

P purescript-prelude M Data.Functor
fromMaybe' :: forall a. Maybe a -> a -> a

An infix form of fromMaybe with arguments flipped.

P purescript-errors M Control.Error.Util
mulNat :: forall proxy a b c. ProductNat a b c => proxy a -> proxy b -> proxy c
P purescript-typelevel-peano M Type.Data.Peano.Nat.Definition
plus :: forall proxy a b c. SumInt a b c => proxy a -> proxy b -> proxy c
P purescript-typelevel-peano M Type.Data.Peano.Int.Definition
plusNat :: forall proxy a b c. SumNat a b c => proxy a -> proxy b -> proxy c
P purescript-typelevel-peano M Type.Data.Peano.Nat.Definition
powNat :: forall proxy a b c. ExponentiationNat a b c => proxy a -> proxy b -> proxy c
> powNat d2 d3
8 -- : NProxy D8

a raised to the power of b a^b = c

P purescript-typelevel-peano M Type.Data.Peano.Nat.Definition
prod :: forall proxy a b c. ProductInt a b c => proxy a -> proxy b -> proxy c
P purescript-typelevel-peano M Type.Data.Peano.Int.Definition
sampleOnLeft_ :: forall event a b. IsEvent event => event a -> event b -> event b
P purescript-hyrule M FRP.Event.Class
divides :: forall a. Divisible a => a -> a -> Maybe a
P purescript-sparse-polynomials M Data.Sparse.Polynomial
downcast :: forall ctor from to. ctor -> from -> Maybe to

Attempt to cast to a type given a constructor for it

P purescript-ffi-simple M FFI.Simple.Objects
applySecond :: forall v1 v0 f c. HasApply c f => HasConst c => HasIdentity c => HasMap c f => ObjectOf c v0 => ObjectOf c v1 => ObjectOf c (c v1 v1) => ObjectOf c (c v0 (c v1 v1)) => ObjectOf c (c (c v1 v1) (c v0 (c v1 v1))) => f v0 -> f v1 -> f v1
P purescript-subcategory M Control.Subcategory.Functor.HasApply
concat :: forall xs ys zs lproxy. Concat xs ys zs => lproxy xs -> lproxy ys -> lproxy zs
P purescript-typelevel-lists M Type.Data.List
downcast :: forall ctor from to. ctor -> from -> Maybe to

Attempt to cast to a type given a constructor for it

P purescript-dom-simple M DOM.Simple.Event
drop :: forall n xs ys lproxy iproxy. Drop n xs ys => iproxy n -> lproxy xs -> lproxy ys
P purescript-typelevel-lists M Type.Data.List
lookup :: forall c k r. Lookup c k r => c -> k -> Maybe r

Given some type and a key on that type, extract some value that corresponds to that key.

P purescript-httpure M HTTPure.Lookup
lookup :: forall c k r. Lookup c k r => c -> k -> Maybe r

Given some type and a key on that type, extract some value that corresponds to that key.

P purescript-httpurple M HTTPurple.Lookup
map :: forall f xs ys fproxy kproxy lproxy. Map f xs ys => fproxy f -> kproxy xs -> lproxy ys
P purescript-typelevel-lists M Type.Data.List
take :: forall n xs ys lproxy iproxy. Take n xs ys => iproxy n -> lproxy xs -> lproxy ys
P purescript-typelevel-lists M Type.Data.List
zip :: forall x y z lproxy. Zip x y z => lproxy x -> lproxy y -> lproxy z
P purescript-typelevel-lists M Type.Data.List
getOrAlt :: forall v s r' r l h g f. Alternative h => Cons s v r' r => RowToList r l => RGetOrAlt f g s l r => g s -> f r -> h v
P purescript-struct M Data.Struct.GetOrAlt.GetOrAlt
max :: forall a. PartialOrd a => a -> a -> Maybe a
P purescript-partial-order M Data.Ord.Partial
min :: forall a. PartialOrd a => a -> a -> Maybe a
P purescript-partial-order M Data.Ord.Partial
pMax :: forall a. PartialOrd a => a -> a -> Maybe a
P purescript-higher-order M Data.PartialOrd
pMin :: forall a. PartialOrd a => a -> a -> Maybe a
P purescript-higher-order M Data.PartialOrd
rsingleton :: forall f g s v r. RSingleton f g s => Cons s v () r => Lacks s () => g s -> v -> f r
P purescript-struct M Data.Struct.Singleton.RSingleton
singleton :: forall v s r g f. Cons s v () r => Lacks s () => RSingleton f g s => g s -> v -> f r
P purescript-struct M Data.Struct.Singleton
_call :: forall b a. a -> (a -> b) -> b
P purescript-neon M Neon.Operator
after :: forall k f. Eq k => Foldable f => k -> f k -> Maybe k
P purescript-causal-graphs M Data.Graph.Causal.Utility
always_ :: forall a i. i -> a -> Maybe i
P purescript-spork M Spork.Html.Events
before :: forall k f. Eq k => Foldable f => k -> f k -> Maybe k
P purescript-causal-graphs M Data.Graph.Causal.Utility
bind :: forall a. Semigroup a => a -> (a -> a) -> a
P purescript-qualified-do M QualifiedDo.Semigroup
extract :: forall r x a. TypeEquals r x => r -> (x -> a) -> a
P purescript-eta-conversion M Data.ReaderTEtaConversionTransformer
functorDecorateFlipped :: forall b a f. Functor f => Decorate b a => f a -> b -> f b
P purescript-materialize M Materialize.Markup.Decorate
nmapFlipped :: forall b a fb fa. NestedFunctor fa fb a b => fa -> (a -> b) -> fb
P purescript-nested-functor M Data.Functor.Nested

t

t :: forall b a. a -> (a -> b) -> b

Reverse application which is probably exist inside Lens module

P purescript-birds M Aviary.Birds

t

t :: forall b a. a -> (a -> b) -> b
P purescript-combinators M Data.Combinators
thrush :: forall b a. a -> (a -> b) -> b

T combinator - thrush

CI

Λ a b . a → (a → b) → b

λ x f . f x

P purescript-birds M Aviary.Birds
applyFirst :: forall a b f. Apply f => f a -> f b -> f a

Combine two effectful actions, keeping only the result of the first.

P purescript-prelude M Control.Apply
alt :: forall f a. Alt f => f a -> f a -> f a
P purescript-control M Control.Alt
optional :: forall f a. Alt f => Applicative f => f a -> f (Maybe a)

One or none.

optional empty = pure Nothing

The behaviour of optional (pure x) depends on whether the Alt instance satisfy the left catch law (pure a <|> b = pure a).

Either e does:

optional (Right x) = Right (Just x)

But Array does not:

optional [x] = [Just x, Nothing]
P purescript-maybe M Data.Maybe
choose :: forall m a. MonadGen m => m a -> m a -> m a

Creates a generator that outputs a value chosen from one of two existing existing generators with even probability.

P purescript-gen M Control.Monad.Gen
genMaybe :: forall m a. MonadGen m => m a -> m (Maybe a)

Creates a generator that outputs Maybe values, choosing a value from another generator for the inner value. The generator has a 75% chance of returning a Just over a Nothing.

P purescript-gen M Control.Monad.Gen.Common
sampleOnRight_ :: forall event a b. IsEvent event => event a -> event b -> event a

Create an Event which samples the latest values from the first event at the times when the second event fires, ignoring the values produced by the second event.

P purescript-hyrule M FRP.Event.Class
sampleOn_ :: forall b a event. IsEvent event => event a -> event b -> event a

Create an Event which samples the latest values from the first event at the times when the second event fires, ignoring the values produced by the second event.

P purescript-event M FRP.Event.Class
applyFirst :: forall v1 v0 f c. HasApply c f => HasConst c => HasMap c f => ObjectOf c v0 => ObjectOf c v1 => ObjectOf c (c v1 v0) => f v0 -> f v1 -> f v0
P purescript-subcategory M Control.Subcategory.Functor.HasApply
flipScalarMul :: forall k f. VectorField f k => f k -> k -> f k
P purescript-vectorfield M Data.VectorField
max1 :: forall f a. Ord1 f => f a -> f a -> f a
P purescript-higher-order M Data.Operator.Ord
min1 :: forall f a. Ord1 f => f a -> f a -> f a
P purescript-higher-order M Data.Operator.Ord
onIntegrityError :: forall m a. MonadError PGError m => m a -> m a -> m a
P purescript-postgresql-client M Database.PostgreSQL.PG
optional :: forall f a. Alt f => Applicative f => f a -> f (Maybe a)
P purescript-optparse M Options.Applicative.Types
alt :: forall f a. Alternative f => f a -> f a -> f a
P purescript-invertible-syntax M Text.Syntax.Classes
dappend :: forall cnt a. Diff cnt => cnt a -> cnt a -> cnt a
P purescript-difference-containers M Containers.Difference
fromFoldableL :: forall a c f. Foldable f => Consable c => c a -> f a -> c a

Conversion from Foldable to Consable using foldl.

fromFoldableL [] [1,2,3,4]  == [4,3,2,1]
fromFoldableL [0] [1,2,3,4] == [4,3,2,1,0]
P purescript-consable M Data.Consable
fromFoldableR :: forall a c f. Foldable f => Consable c => c a -> f a -> c a

Conversion from Foldable to Consable using foldr.

fromFoldableR [] [1,2,3,4]  == [1,2,3,4]
fromFoldableR [5] [1,2,3,4] == [1,2,3,4,5]
P purescript-consable M Data.Consable
interleave :: forall m a. MonadLogic m => m a -> m a -> m a
P purescript-logic M Control.Monad.Logic.Class
optionMaybe :: forall a m. Alternative m => m a -> m (Maybe a)
P purescript-parsers M Text.Parsing.Combinators
snoc :: forall f a. Container f => f a -> a -> f a
P purescript-logoot-core M Data.Container
voidRight :: forall f a b. Functor f => a -> f b -> f a

Ignore the return value of a computation, using the specified return value instead.

P purescript-prelude M Data.Functor
fromJust :: forall a. Partial => Maybe a -> a

A partial function that extracts the value from the Just data constructor. Passing Nothing to fromJust will throw an error at runtime.

P purescript-maybe M Data.Maybe
fromMaybe :: forall f a. Unfoldable f => Maybe a -> f a

Convert a Maybe to any Unfoldable, such as lists or arrays.

fromMaybe (Nothing :: Maybe Int) == []
fromMaybe (Just 1) == [1]
P purescript-unfoldable M Data.Unfoldable
enumFromTo :: forall a u. Enum a => Unfoldable1 u => a -> a -> u a

Returns a contiguous sequence of elements from the first value to the second value (inclusive).

enumFromTo 0 3 = [0, 1, 2, 3]
enumFromTo 'c' 'a' = ['c', 'b', 'a']

The example shows Array return values, but the result can be any type with an Unfoldable1 instance.

P purescript-enums M Data.Enum
seek :: forall s a w. ComonadStore s w => s -> w a -> w a

Reposition the focus at the specified position.

P purescript-transformers M Control.Comonad.Store.Class
filled :: forall m a style. MonadCanvasAction m => CanvasStyle style => style -> m a -> m a

Run a MonadCanvasAction with the given fillStyle, resetting it to the previous value after

P purescript-canvas-action M Graphics.CanvasAction
putCtx :: forall a html ctx. Ctx ctx html => ctx -> html a -> html a
P purescript-chameleon-transformers M Chameleon.Transformers.Ctx.Class
stroked :: forall m a style. MonadCanvasAction m => CanvasStyle style => style -> m a -> m a

Run a MonadCanvasAction with the given strokeStyle, resetting it to the previous value after

P purescript-canvas-action M Graphics.CanvasAction
tellAccum :: forall acc html a. TellAccum acc html => acc -> html a -> html a
P purescript-chameleon-transformers M Chameleon.Transformers.Accum.Class
get :: forall v s r' r l g f. Cons s v r' r => RGet f g s l r => RowToList r l => g s -> f r -> v
P purescript-struct M Data.Struct.Get.Get
match :: forall v r1 r0 l1 l0 g f. RMatch f g v l0 r0 l1 r1 => RowToList r0 l0 => RowToList r1 l1 => f r0 -> g r1 -> v
P purescript-struct M Data.Struct.Match.Match
scalarMul :: forall f k. VectorField f k => k -> f k -> f k
  • ∀v in V: one * v == v
  • ∀a b in K, v in V: a * (b .* v) = (a * b) .* v
  • ∀a b in K, v in V:
    • a .* (u + v) = a .* u + a .* v
    • (a + b) .* v = a .* v + b .* v
P purescript-vectorfield M Data.VectorField
cons :: forall t a. Consable t => a -> t a -> t a
P purescript-consable M Data.Consable
cons :: forall f a. Container f => a -> f a -> f a
P purescript-logoot-core M Data.Container
convertOption :: forall field from to sproxy. ConvertOption field from to => sproxy field -> from -> to
P purescript-web-fetch M Web.Fetch.Request
fromJust :: forall a. Maybe a -> a
P purescript-cypress M Cypress.Actions
fromJust' :: forall a. Maybe a -> a

The partial and unsafe version of fromJust.

P purescript-sudoku M Sudoku.Util
functorDecorate :: forall b a f. Functor f => Decorate a b => a -> f b -> f a
P purescript-materialize M Materialize.Markup.Decorate
index :: forall f a b. Representable f a => f b -> (a -> b)
P purescript-functor-vector M Data.Functor.Representable
insert :: forall f a. Container f => Ord a => a -> f a -> f a
P purescript-logoot-core M Data.Container
invokeAction :: forall m res args ctrl act. RemoteAction act ctrl args res => MonadReader Visualforce m => MonadAff m => MonadError RemoteActionError m => IsSymbol ctrl => Encode args => Decode res => act -> args -> m res

Function that invoke the action defined by referring to contraints which holds details about the correct controller to invoke. Example:

data PCMRequests = ..

data CreatePCMRequests = CreatePCMRequests

instance remoteActionCreatePCMs :: RemoteAction CreatePCMRequests "PCMMassController.createRecords" PCMRequests Unit

createPCMRequest :: Visualforce -> PCMRequests -> Aff (Either RemoteActionError Unit)
createPCMRequest vf rec =  runReaderT (runExceptT $ invokeAction CreatePCMRequests rec) vf
P purescript-sforce-remote-action M Salesforce.RemoteAction
option :: forall a m. Alternative m => a -> m a -> m a
P purescript-parsers M Text.Parsing.Combinators
replaceInArray :: forall a f. HasUuid a => Functor f => a -> f a -> f a
P purescript-liminal M Classes.HasUuid
splice :: forall f t. Corecursive t (SqlF f) => Maybe t -> t
P purescript-sql-squared M SqlSquared.Constructors