Search results

liftEffect :: forall m a. MonadEffect m => Effect a -> m a
P purescript-effect M Effect.Class
pull :: forall a m. MonadEffect m => Effect a -> m a
P purescript-specular M Specular.FRP.Base
read :: forall g a. RWLockGuard g => g a -> Aff a
P purescript-threading M Threading.Data.RWLock
pure :: forall f a. Applicative f => a -> f a
P purescript-prelude M Control.Applicative
forever :: forall m a b. MonadRec m => m a -> m b

forever runs an action indefinitely, using the MonadRec instance to ensure constant stack usage.

For example:

main = forever $ trace "Hello, World!"
P purescript-tailrec M Control.Monad.Rec.Class
singleton :: forall f a. Unfoldable1 f => a -> f a

Contain a single value. For example:

singleton "foo" == (NEL.singleton "foo" :: NEL.NonEmptyList String)
P purescript-unfoldable M Data.Unfoldable1
proof :: forall a b p. TypeEquals a b => p a -> p b
P purescript-type-equality M Type.Equality
elements :: forall m f a. MonadGen m => Foldable1 f => f a -> m a

Creates a generator that outputs a value chosen from a selection with uniform probability.

P purescript-gen M Control.Monad.Gen
unsafePerformEffect :: forall a. Effect a -> a

Run an effectful computation.

Note: use of this function can result in arbitrary side-effects.

P purescript-effect M Effect.Unsafe
downFrom :: forall a u. Enum a => Unfoldable u => a -> u a

Produces all predecessors of an Enum value, excluding the start value.

P purescript-enums M Data.Enum
downFromIncluding :: forall a u. Enum a => Unfoldable1 u => a -> u a

Produces all predecessors of an Enum value, including the start value.

downFromIncluding top will return all values in an Enum, in reverse order.

P purescript-enums M Data.Enum
upFrom :: forall a u. Enum a => Unfoldable u => a -> u a

Produces all successors of an Enum value, excluding the start value.

P purescript-enums M Data.Enum
upFromIncluding :: forall a u. Enum a => Unfoldable1 u => a -> u a

Produces all successors of an Enum value, including the start value.

upFromIncluding bottom will return all values in an Enum.

P purescript-enums M Data.Enum
coerce :: forall f a b. Contravariant f => Functor f => f a -> f b
P purescript-contravariant M Data.Functor.Contravariant
throwError :: forall e m a. MonadThrow e m => e -> m a
P purescript-transformers M Control.Monad.Error.Class
inj :: forall f g a. Inject f g => f a -> g a
P purescript-functors M Data.Functor.Coproduct.Inject
join :: forall f m a. MonadFork f m => f a -> m a
P purescript-fork M Control.Monad.Fork.Class
uninterruptible :: forall e f m a. MonadBracket e f m => m a -> m a
P purescript-fork M Control.Monad.Fork.Class
cleared :: forall f a b. Filterable f => f a -> f b

Filter out all values.

P purescript-filterable M Data.Filterable
liftBase :: forall b m a. MonadBase b m => b a -> m a
P purescript-monad-control M Control.Monad.Base
length :: forall sproxy proxy a b. Length a b => sproxy a -> proxy b
P purescript-typelevel-peano M Type.Data.Peano.Nat.Parse
parseInt :: forall sproxy proxy sym a. ParseInt sym a => sproxy sym -> proxy a

parse Int a Value-Level

parseInt (Proxy  :: _ "-1337") ~> N1337
parseInt (SProxy :: _ "-1337") ~> N1337
    -- N1137 would be type alias for Neg (Succ^1337 Z)
P purescript-typelevel-peano M Type.Data.Peano.Int.Parse
parseNat :: forall sproxy proxy sym a. ParseNat sym a => sproxy sym -> proxy a

value-level parse of number

parseNat (Proxy  "10") ~> D10
parseNat (SProxy "10") ~> D10
P purescript-typelevel-peano M Type.Data.Peano.Nat.Parse
folded :: forall event a. IsEvent event => Monoid a => event a -> event a

Combine subsequent events using a Monoid.

P purescript-hyrule M FRP.Event.Class
lambek :: forall t f. Recursive t f => Corecursive t f => t -> f t
P purescript-matryoshka M Matryoshka.Fold
project :: forall t f. Recursive t f => t -> f t
P purescript-matryoshka M Matryoshka.Class.Recursive
folded :: forall a event. IsEvent event => Monoid a => event a -> event a

Combine subsequent events using a Monoid.

P purescript-event M FRP.Event.Class
sequenceProduct :: forall specI specO f. SequenceProduct specI specO f => specI -> f specO
P purescript-classless M Classless
sort :: forall f a. Functor f => Foldable f => Unfoldable f => Ord a => f a -> f a

Sort any structure (which has Foldable, Unfoldable, and Functor instances) by converting to an OrdSeq and back again. I am fairly sure this is usually O(n*log(n)), although of course this depends on the Unfoldable and Foldable instances.

P purescript-sequences M Data.Sequence.Ordered
init :: forall xs ys lproxy. Init xs ys => lproxy xs -> lproxy ys
P purescript-typelevel-lists M Type.Data.List
length :: forall xs r lproxy iproxy. Length xs r => lproxy xs -> iproxy r
P purescript-typelevel-lists M Type.Data.List
pure :: forall v f c. HasPure c f => ObjectOf c v => v -> f v
P purescript-subcategory M Control.Subcategory.Functor.HasPure
restoreAfter :: forall m a. MonadCanvasAction m => m a -> m a

Runs save, then the provided action, then restore

P purescript-canvas-action M Graphics.CanvasAction
bottom1_ :: forall f a. Bottom1_ f => a -> f a
P purescript-higher-order M Data.Operator.Bottom
bottom2 :: forall f a b. Bottom2 f a => a -> f b
P purescript-higher-order M Data.Operator.Bottom
top1_ :: forall f a. Top1_ f => a -> f a
P purescript-higher-order M Data.Operator.Top
act :: forall m b a. Mother m => a -> m b
P mother-monad M Control.Monad.Mother.Class
drain :: forall a s n n1. ToString n1 s => IsSymbol s => Analytic (a n) => Analytic (a n1) => Add n1 1 n => a n -> a n1

Decrement the dimension of a point/vector by removing its last coordinate.

P purescript-geometria M Data.Geometria.Types
dsingleton :: forall cnt a. Diff cnt => a -> cnt a
P purescript-difference-containers M Containers.Difference
forever :: forall b a m. Monad m => m a -> m b
P purescript-game M Game.Util
immerse :: forall a n n1. Analytic (a n) => Analytic (a n1) => Add n 1 n1 => a n -> a n1

Increments the dimension of a point/vector by adding a zero coordinate after the other coordinates.

P purescript-geometria M Data.Geometria.Types
lookAhead :: forall m a. LookAheadParsing m => m a -> m a
P purescript-parsers M Text.Parsing.Classes
mockFun :: forall params fun verifyParams m. MockBuilder params fun verifyParams => MonadEffect m => params -> m fun
P purescript-pmock M Test.PMock
once :: forall a m. MonadLogic m => m a -> m a
P purescript-logic M Control.Monad.Logic.Class
pure :: forall d a. Syntax d => Eq a => a -> d a
P purescript-invertible-syntax M Text.Syntax.Classes
pure :: forall f a. Unital Function Unit Unit f => Functor f => a -> f a
P purescript-monoidal M Data.Functor.ApplicativeDo
pure :: forall a b. HasPure a => b -> a b
P purescript-neon M Neon.Class.HasPure
pure :: forall f a. Applicative f => a -> f a
P purescript-qualified-do M QualifiedDo.ParApply
query :: forall m q r. MonadSession m => AsQuery q => FromRows r => q -> m r

Executes a query and unmarshals the result into r

P purescript-postgresql M Control.Monad.Postgres.Session
read :: forall box val m. Read box val => MonadDelay m => box -> m val

Read the current value. Will never cause a refresh.

P purescript-toestand M Toestand.Classes
repeat :: forall a u. Unfoldable1 u => a -> u a

Create an infinite Unfoldable1 by repeating a single element.

P purescript-trivial-unfold M Data.Unfoldable1.Trivial1
siteClock :: forall s m i c. Site s m i c => s -> m c
P purescript-logoot-core M Logoot.Types.Class.Site
siteId :: forall s m i c. Site s m i c => s -> m i
P purescript-logoot-core M Logoot.Types.Class.Site
throw :: forall (t10 :: Type -> Type) (t11 :: Type) (a12 :: Type). MonadThrow Error t10 => Show a12 => a12 -> t10 t11
P purescript-droplet M Droplet.Driver.Internal.Migration
try :: forall m a. Parsing m => m a -> m a
P purescript-parsers M Text.Parsing.Classes
unfold :: forall f a s. Convert s (Statements a) => Unfoldable1 f => s -> f a
P purescript-qualified-do M QualifiedDo.Unfoldable
abs :: forall a. Ord a => Ring a => a -> a

The absolute value function. abs x is defined as if x >= zero then x else negate x.

P purescript-prelude M Data.Ord
from :: forall a rep. Generic a rep => a -> rep
P purescript-prelude M Data.Generic.Rep
genericNot :: forall a rep. Generic a rep => GenericHeytingAlgebra rep => a -> a

A Generic implementation of the not member from the HeytingAlgebra type class.

P purescript-prelude M Data.HeytingAlgebra.Generic
genericNot' :: forall a. GenericHeytingAlgebra a => a -> a
P purescript-prelude M Data.HeytingAlgebra.Generic
negate :: forall a. Ring a => a -> a

negate x can be used as a shorthand for zero - x.

P purescript-prelude M Data.Ring
not :: forall a. HeytingAlgebra a => a -> a
P purescript-prelude M Data.HeytingAlgebra
recip :: forall a. DivisionRing a => a -> a
P purescript-prelude M Data.DivisionRing
signum :: forall a. Ord a => Ring a => a -> a

The sign function; returns one if the argument is positive, negate one if the argument is negative, or zero if the argument is zero. For floating point numbers with signed zeroes, when called with a zero, this function returns the argument in order to preserve the sign. For any x, we should have signum x * abs x == x.

P purescript-prelude M Data.Ord
to :: forall a rep. Generic a rep => rep -> a
P purescript-prelude M Data.Generic.Rep
unwrap :: forall t a. Newtype t a => t -> a
P purescript-newtype M Data.Newtype
wrap :: forall t a. Newtype t a => a -> t
P purescript-newtype M Data.Newtype
extract :: forall w a. Comonad w => w a -> a
P purescript-control M Control.Comonad
unsafeCoerce :: forall a b. a -> b

A highly unsafe function, which can be used to persuade the type system that any type is the same as any other type. When using this function, it is your (that is, the caller's) responsibility to ensure that the underlying representation for both types is the same.

Because this function is extraordinarily flexible, type inference can greatly suffer. It is highly recommended to define specializations of this function rather than using it as-is. For example:

fromBoolean :: Boolean -> Json
fromBoolean = unsafeCoerce

This way, you won't have any nasty surprises due to the inferred type being different to what you expected.

After the v0.14.0 PureScript release, some of what was accomplished via unsafeCoerce can now be accomplished via coerce from purescript-safe-coerce. See that library's documentation for more context.

P purescript-unsafe-coerce M Unsafe.Coerce
inj :: forall a b. Inject a b => a -> b
P purescript-either M Data.Either.Inject
and :: forall a f. Foldable f => HeytingAlgebra a => f a -> a

The conjunction of all the values in a data structure. When specialized to Boolean, this function will test whether all of the values in a data structure are true.

P purescript-foldable-traversable M Data.Foldable
fold :: forall f m. Foldable f => Monoid m => f m -> m

Fold a data structure, accumulating values in some Monoid.

P purescript-foldable-traversable M Data.Foldable
fold1 :: forall t m. Foldable1 t => Semigroup m => t m -> m

Fold a data structure, accumulating values in some Semigroup.

P purescript-foldable-traversable M Data.Semigroup.Foldable
length :: forall a b f. Foldable f => Semiring b => f a -> b

Returns the size/length of a finite structure. Optimized for structures that are similar to cons-lists, because there is no general way to do better.

P purescript-foldable-traversable M Data.Foldable
maximum :: forall f a. Ord a => Foldable1 f => f a -> a
P purescript-foldable-traversable M Data.Semigroup.Foldable
minimum :: forall f a. Ord a => Foldable1 f => f a -> a
P purescript-foldable-traversable M Data.Semigroup.Foldable
or :: forall a f. Foldable f => HeytingAlgebra a => f a -> a

The disjunction of all the values in a data structure. When specialized to Boolean, this function will test whether any of the values in a data structure is true.

P purescript-foldable-traversable M Data.Foldable
product :: forall a f. Foldable f => Semiring a => f a -> a

Find the product of the numeric values in a data structure.

P purescript-foldable-traversable M Data.Foldable
sum :: forall a f. Foldable f => Semiring a => f a -> a

Find the sum of the numeric values in a data structure.

P purescript-foldable-traversable M Data.Foldable
unsafePartial :: forall a. (Partial => a) -> a

Discharge a partiality constraint, unsafely.

P purescript-partial M Partial.Unsafe
from :: forall a b. TypeEquals a b => b -> a
P purescript-type-equality M Type.Equality
to :: forall a b. TypeEquals a b => a -> b
P purescript-type-equality M Type.Equality
ask :: forall e w a. ComonadAsk e w => w a -> e
P purescript-transformers M Control.Comonad.Env.Class
pos :: forall s w a. ComonadStore s w => w a -> s
P purescript-transformers M Control.Comonad.Store.Class
convertDuration :: forall a b. Duration a => Duration b => a -> b

Converts directly between durations of differing types.

P purescript-datetime M Data.Time.Duration
negateDuration :: forall a. Duration a => a -> a

Negates a duration, turning a positive duration negative or a negative duration positive.

P purescript-datetime M Data.Time.Duration
coerce :: forall a b. Coercible a b => a -> b

Coerce a value of one type to a value of some other type, without changing its runtime representation. This function behaves identically to unsafeCoerce at runtime. Unlike unsafeCoerce, it is safe, because the Coercible constraint prevents any use of this function from compiling unless the compiler can prove that the two types have the same runtime representation.

One application for this function is to avoid doing work that you know is a no-op because of newtypes. For example, if you have an Array (Conj a) and you want an Array (Disj a), you could do Data.Array.map (un Conj >>> Disj), but this performs an unnecessary traversal of the array, with O(n) cost. coerce accomplishes the same with only O(1) cost:

mapConjToDisj :: forall a. Array (Conj a) -> Array (Disj a)
mapConjToDisj = coerce
P purescript-safe-coerce M Safe.Coerce
div10 :: forall x q. Div10 x q => x -> q
P purescript-typelevel M Data.Typelevel.Num.Ops
isDivBy :: forall d x. IsDivBy d x => d -> x
P purescript-typelevel M Data.Typelevel.Num.Ops
mul10 :: forall x q. Mul10 x q => x -> q
P purescript-typelevel M Data.Typelevel.Num.Ops
not :: forall b1 b2. Not b1 b2 => b1 -> b2
P purescript-typelevel M Data.Typelevel.Bool
pred :: forall x y. Pred x y => x -> y
P purescript-typelevel M Data.Typelevel.Num.Ops
succ :: forall x y. Succ x y => x -> y
P purescript-typelevel M Data.Typelevel.Num.Ops
cast :: forall a b. Castable a b => a -> b
P purescript-untagged-union M Untagged.Castable
getSingleton :: forall f a. SingletonFunctor f => f a -> a
P purescript-monad-control M Data.Functor.Singleton
coerce :: forall expected given. Coerce given expected => given -> expected
P purescript-undefined-is-not-a-problem M Data.Undefined.NoProblem.Closed
coerce :: forall expected given. Coerce given expected => given -> expected
P purescript-undefined-is-not-a-problem M Data.Undefined.NoProblem.Open
ginverse :: forall g. Group g => g -> g
P purescript-group M Data.Group
colambek :: forall t f. Recursive t f => Corecursive t f => f t -> t
P purescript-matryoshka M Matryoshka.Unfold
convertTo :: forall t f r. Recursive t f => Corecursive r f => t -> r
P purescript-matryoshka M Matryoshka.Refold
embed :: forall t f. Corecursive t f => f t -> t
P purescript-matryoshka M Matryoshka.Class.Corecursive
fill :: forall partial complete. Fillable partial complete => partial -> complete
P purescript-justifill M Justifill.Fillable
justify :: forall unjust just. Justifiable unjust just => unjust -> just
P purescript-justifill M Justifill.Justifiable
mnegateL :: forall r x. LeftModule x r => x -> x
P purescript-modules M Data.Ring.Module
mnegateR :: forall r x. RightModule x r => x -> x
P purescript-modules M Data.Ring.Module
nextPrime :: forall a. Ord a => Semiring a => EuclideanRing a => a -> a

Ad infinitum

P purescript-sparse-polynomials M Data.Sparse.Polynomial
pad :: forall @n a b. Pad n a b => a -> b
P purescript-sparse-polynomials M Data.Sparse.Polynomial
unpad :: forall @n a b. Unpad n a b => b -> a
P purescript-sparse-polynomials M Data.Sparse.Polynomial
area :: forall s n. ToSize n s => Semiring n => s -> n

Get the area of a size

P purescript-polymorphic-vectors M Data.Vector.Polymorphic
convertPos :: forall p1 p2 n. ToPos n p1 => FromPos n p2 => p1 -> p2
P purescript-polymorphic-vectors M Data.Vector.Polymorphic
convertRegion :: forall p1 p2 n. ToRegion n p1 => FromRegion n p2 => p1 -> p2
P purescript-polymorphic-vectors M Data.Vector.Polymorphic
convertSize :: forall p1 p2 n. ToSize n p1 => FromSize n p2 => p1 -> p2
P purescript-polymorphic-vectors M Data.Vector.Polymorphic
init :: forall fn a. Init fn a => fn -> a
P purescript-classless M Classless
initProduct :: forall f a. InitProduct f a => f -> a
P purescript-classless M Classless
measure :: forall a v. Measured a v => a -> v
P purescript-sequences M Data.Sequence.Internal
midPos :: forall s p n. ToRegion n s => FromPos n p => EuclideanRing n => s -> p

Get the center position of a region

P purescript-polymorphic-vectors M Data.Vector.Polymorphic
perimeter :: forall s n. ToSize n s => Semiring n => s -> n

Get the perimeter of a size

P purescript-polymorphic-vectors M Data.Vector.Polymorphic
ratio :: forall s n. ToSize n s => EuclideanRing n => s -> n

Get the ratio of a size by dividing the width by the height

P purescript-polymorphic-vectors M Data.Vector.Polymorphic
undefer :: forall a. (Deferred => a) -> a

Note: use of this function may result in arbitrary side effects.

P purescript-promises M Effect.Promise.Unsafe
always :: forall a b. Always a b => a -> b
P purescript-monoid-extras M Data.Monoid.Always
at :: forall m. XPathLike m => m -> m

Prepend an '@'

P purescript-xpath-like M Data.XPath
complement :: forall p. Bounded p => Ring p => p -> p
P purescript-probability M Math.Probability
convert :: forall b a. TokenUnit a => TokenUnit b => a -> b

Convert between two denominations

P purescript-web3 M Network.Ethereum.Web3.Types.TokenUnit
debugger :: forall a. a -> a

Inserts a JavaScript debugger statement, then returns its argument.

P purescript-debuggest M Debug
dir :: forall a. a -> a

Calls console.dir with its argument, then returns it.

P purescript-debuggest M Debug
inj :: forall l a. Includes l a => a -> l

Inject a value into an otherwise empty heterogeneous list.

P purescript-monoid-extras M Data.Monoid.MList
log :: forall a. a -> a

Calls console.log with its argument, then returns it.


-- log a value as it's used
func a = todo $ log a

-- explicitly log an argument because it may not be used
func a =
  let
    _ = log a
  in
    todo

-- log the value inside a functor
func ma = do
  a <- log <$> pure ma
  todo
P purescript-debuggest M Debug
logShow :: forall a. Show a => a -> a

For an argument a, calls console.log on show a, then returns a.

P purescript-debuggest M Debug
nextSibling :: forall n m. IsNode n => IsNode m => n -> m

Gets the next sibling

P purescript-dom-simple M DOM.Simple.Node
parentNode :: forall n m. IsNode n => IsNode m => n -> m
P purescript-dom-simple M DOM.Simple.Node
prevSibling :: forall n m. IsNode n => IsNode m => n -> m

Gets the previous sibling

P purescript-dom-simple M DOM.Simple.Node
tUnit :: forall u1 u0 bf c. HasTUnit c bf u0 u1 => HasUnit c u1 => u0 -> u1
P purescript-subcategory M Control.Subcategory.HasTUnit
unsafeDir :: forall a b. a -> b

Like dir except it coerces the input to any type.

P purescript-debuggest M Debug
unsafeLog :: forall a b. a -> b

Like log except it coerces the input to any type.

P purescript-debuggest M Debug
xx :: forall m. XPathLike m => m -> m

Prepend a dummy namespace

P purescript-xpath-like M Data.XPath
abs :: forall a. Num a => a -> a
P purescript-numerics M Data.Num
asTS :: forall b a. IsTSEq a b => a -> b
P purescript-tscompat M Data.TSCompat.Class
coerce :: forall a b. Coercible a b => a -> b
P purescript-coercible M Control.Coercible
convertImpl :: forall input output. ToInternalConverter input output => input -> output
P purescript-js-fetch M JS.Fetch.Request
dbgs :: forall s. Show s => s -> s
P purescript-binary M Debug
embed :: forall a r. Algebra a r => r -> a
P purescript-eth-core M Network.Ethereum.Core.BigNumber
foldLineNames :: forall i o. FoldLineNames i o => i -> o
P purescript-tecton M Tecton.Internal
foldOf :: forall s t a b @sym lenses. IsSymbol sym => ParseSymbol sym lenses => ConstructBarlow lenses (Forget a) s t a b => s -> a
P purescript-barlow-lens M Data.Lens.Barlow.Helpers
from1 :: forall f rep a. Generic1 f rep => f a -> rep
P purescript-higher-order M Data.Operator.Generic.Rep
fromFractional :: forall b a. Fractional a => Fractional b => a -> b

A helper function for general conversion between Fractional values.

P purescript-numerics M Data.Fractional
fromIntegral :: forall b a. Integral a => Integral b => a -> b

A helper function for general conversion between Integral values.

P purescript-numerics M Data.Integral
hasJSRep :: forall a. HasJSRep a => a -> a
P purescript-has-js-rep M HasJSRep
magicProps :: forall props. props -> props
P purescript-reactix M Reactix.DOM.HTML
mkPrim :: forall a b. Primitive a b => a -> b
P purescript-homogeneous-objects M Data.HObject.Primitive
mnegateL :: forall r x. LeftModule x r => x -> x
P purescript-ring-modules M Data.Ring.Module
mnegateR :: forall r x. RightModule x r => x -> x
P purescript-ring-modules M Data.Ring.Module
negate :: forall a. Num a => a -> a
P purescript-numerics M Data.Num
not :: forall a. Binary a => a -> a
P purescript-binary M Data.Binary
px :: forall next res. PursxStringAnonymous ((Proxy "a") /\ (Proxy "") /\ (Record ())) next res => next -> res
P purescript-deku M Deku.Pursx.Anonymous
signum :: forall a. Num a => a -> a
P purescript-numerics M Data.Num
stripLeadingZeros :: forall a. Elastic a => a -> a
P purescript-binary M Data.Binary
toTuples :: forall a b. ToTuples a b => a -> b
P purescript-ts-bridge M TsBridge.Types.Intersection
unsafeLeftShift :: forall a. Binary a => a -> a
P purescript-binary M Data.Binary
unsafeRightShift :: forall a. Binary a => a -> a
P purescript-binary M Data.Binary
view :: forall s t a b @sym lenses. IsSymbol sym => ParseSymbol sym lenses => ConstructBarlow lenses (Forget a) s t a b => s -> a
P purescript-barlow-lens M Data.Lens.Barlow.Helpers
xformEventProps :: forall props. props -> props
P purescript-reactix M Reactix.DOM.HTML
_diagram :: forall t @d. IsTool t => IsDiagram d => t -> d
P purescript-gojs M GoJS.Tool.Properties
_fromVertex :: forall _l _n e v. LayoutNetwork _l _n e v => e -> v
P purescript-gojs M GoJS.Layout.LayoutEdge.Properties
_layout :: forall d @l. IsDiagram d => IsLayout l => d -> l
P purescript-gojs M GoJS.Diagram.Properties
_locationObject :: forall p @g. IsPart p => IsGraphObject g => p -> g
P purescript-gojs M GoJS.GraphObject.Panel.Part.Properties
_model :: forall d @m. IsDiagram d => IsModel m => d -> m
P purescript-gojs M GoJS.Diagram.Properties
_network :: forall l n _e _v. LayoutNetwork l n _e _v => l -> n
P purescript-gojs M GoJS.Layout.Properties
_nodeTemplate :: forall d @p. IsDiagram d => IsPart p => d -> p
P purescript-gojs M GoJS.Diagram.Properties
_originalFromNode :: forall t @n. IsLinkingBaseTool t => IsNode n => t -> n
P purescript-gojs M GoJS.Tool.LinkingBaseTool.Properties
_originalFromPort :: forall t @p. IsLinkingBaseTool t => IsGraphObject p => t -> p
P purescript-gojs M GoJS.Tool.LinkingBaseTool.Properties
_originalToNode :: forall t @n. IsLinkingBaseTool t => IsNode n => t -> n
P purescript-gojs M GoJS.Tool.LinkingBaseTool.Properties
_originalToPort :: forall t @p. IsLinkingBaseTool t => IsGraphObject p => t -> p
P purescript-gojs M GoJS.Tool.LinkingBaseTool.Properties
_resizeObject :: forall p @g. IsPart p => IsGraphObject g => p -> g
P purescript-gojs M GoJS.GraphObject.Panel.Part.Properties
_rotateObject :: forall p @g. IsPart p => IsGraphObject g => p -> g
P purescript-gojs M GoJS.GraphObject.Panel.Part.Properties
_selectionObject :: forall p @g. IsPart p => IsGraphObject g => p -> g
P purescript-gojs M GoJS.GraphObject.Panel.Part.Properties
_targetPort :: forall t @p. IsLinkingBaseTool t => IsGraphObject p => t -> p
P purescript-gojs M GoJS.Tool.LinkingBaseTool.Properties
_temporaryFromNode :: forall t @n. IsLinkingBaseTool t => IsNode n => t -> n
P purescript-gojs M GoJS.Tool.LinkingBaseTool.Properties
_temporaryFromPort :: forall t @p. IsLinkingBaseTool t => IsGraphObject p => t -> p
P purescript-gojs M GoJS.Tool.LinkingBaseTool.Properties
_temporaryToNode :: forall t @n. IsLinkingBaseTool t => IsNode n => t -> n
P purescript-gojs M GoJS.Tool.LinkingBaseTool.Properties
_temporaryToPort :: forall t @p. IsLinkingBaseTool t => IsGraphObject p => t -> p
P purescript-gojs M GoJS.Tool.LinkingBaseTool.Properties
_toVertex :: forall _l _n e v. LayoutNetwork _l _n e v => e -> v
P purescript-gojs M GoJS.Layout.LayoutEdge.Properties
absoluteValue :: forall a. HasLess a => HasSubtract a => HasZero a => a -> a

Returns the absolute value of a number.

absoluteValue (-2) -- 2
absoluteValue 3 -- 3
P purescript-neon M Neon.Helper
align :: forall r a. Decorate Alignment a => Variadic Alignment r => a -> r
P purescript-materialize M Materialize.Alignment
allpass :: forall i allpass. AllpassCtor i allpass => i -> allpass

Change an allpass filter

allpass { freq: 440.0 }
allpass { freq: 440.0, q: 1.0 }
allpass 440.0
P purescript-wags M WAGS.Change.Optionals
allpass :: forall i allpass. AllpassCtor i allpass => i -> allpass

Create an allpass filter, connecting it to another unit

allpass { freq: 440.0 } { sinOsc: unit }
allpass { freq: 440.0, q: 1.0 } { sinOsc: unit }
allpass 440.0 { sinOsc: unit }
P purescript-wags M WAGS.Create.Optionals
args :: forall params args return. ParamDivider params args return => params -> args
P purescript-pmock M Test.PMock.ParamDivider
argsToTuple :: forall args tuple. ArgsAsTuple args tuple => args -> tuple
P purescript-intertwine M Data.Intertwine.MkIso
array :: forall f t. Corecursive t (SqlF EJsonF) => Foldable f => f t -> t
P purescript-sql-squared M SqlSquared.Constructors
askFor :: forall a p. Ask a => p a -> a

Equivalent to ask except for accepting a Proxy for specifying the exact requested type

P purescript-ask M Control.Ask
bandpass :: forall i bandpass. BandpassCtor i bandpass => i -> bandpass

Create a bandpass filter, connecting it to another unit

bandpass { freq: 440.0 } { sinOsc: unit }
bandpass { freq: 440.0, q: 1.0 } { sinOsc: unit }
bandpass 440.0 { sinOsc: unit }
P purescript-wags M WAGS.Change.Optionals
bandpass :: forall i bandpass. BandpassCtor i bandpass => i -> bandpass

Create a bandpass filter, connecting it to another unit

bandpass { freq: 440.0 } { sinOsc: unit }
bandpass { freq: 440.0, q: 1.0 } { sinOsc: unit }
bandpass 440.0 { sinOsc: unit }
P purescript-wags M WAGS.Create.Optionals
build :: forall b x. Buildable b x => b -> x
P purescript-vexflow M Vex.Builder
callback :: forall a c f. Castable c a => EffectFnMaker f c => f -> a
P purescript-framer-motion M Framer.Motion.Types
cast :: forall from to. Cast from to => from -> to
P purescript-cast M Data.Cast
coerceReactProps :: forall props nonDataProps targetProps. CoerceReactProps props nonDataProps targetProps => props -> targetProps
P purescript-react-basic-dom-beta M Beta.DOM.Internal
coerceReactProps :: forall props nonDataProps targetProps. CoerceReactProps props nonDataProps targetProps => props -> targetProps
P purescript-yoga-react-dom M Yoga.React.DOM.Internal
column :: forall r a. Decorate Column a => Variadic Column r => a -> r
P purescript-materialize M Materialize.Grid
compressor :: forall i compressor. DynamicsCompressorCtor i compressor => i -> compressor

Change a compressor.

compressor { threshold: -10.0 } { buf: playBuf "track" }
compressor { knee: 20.0, ratio: 10.0 } { buf: playBuf "track" }
compressor { attack: 0.01, release: 0.3 } { buf: playBuf "track" }
P purescript-wags M WAGS.Change.Optionals
compressor :: forall i compressor. DynamicsCompressorCtor i compressor => i -> compressor

Make a compressor.

compressor { threshold: -10.0 } { buf: playBuf "track" }
compressor { knee: 20.0, ratio: 10.0 } { buf: playBuf "track" }
compressor { attack: 0.01, release: 0.3 } { buf: playBuf "track" }
P purescript-wags M WAGS.Create.Optionals
constant :: forall i o. ConstantCtor i o => i -> o

Change a constant value

constant 0.5
P purescript-wags M WAGS.Change.Optionals
constant :: forall i o. ConstantCtor i o => i -> o

Make a constant value

constant 0.5
P purescript-wags M WAGS.Create.Optionals
constructRecord :: forall ty fn proxy. ConstructRecord ty fn => proxy ty -> fn
P purescript-mochi M Mochi
convert :: forall a b. Convert a b => a -> b
P purescript-qualified-do M QualifiedDo.Statements
convertImpl :: forall input output. ToInternalConverter input output => input -> output
P purescript-fetch-core M Fetch.Core.Request
convertOptionsWithDefaults :: forall provided all. ConvertOptionsWithDefaults ToCollatorOptions (Record CollatorOptions) provided all => provided -> all
P purescript-js-intl M JS.Intl.Collator
convertOptionsWithDefaults :: forall provided all. ConvertOptionsWithDefaults ToDateTimeFormatOptions (Record DateTimeFormatOptions) provided all => provided -> all
P purescript-js-intl M JS.Intl.DateTimeFormat
convertOptionsWithDefaults :: forall provided all. ConvertOptionsWithDefaults ToNumberFormatOptions (Record NumberFormatOptions) provided all => provided -> all
P purescript-js-intl M JS.Intl.NumberFormat
curried :: forall f output. Curried f output => f -> output
P purescript-lazy-joe M Lazy.Joe
dataTooltipPosition :: forall r a. Decorate TooltipPosition a => Variadic Attribute r => a -> r
P purescript-materialize M Materialize.Tooltips
defMutationOpts :: forall baseClient queryOpts mutationOpts. QueryClient baseClient queryOpts mutationOpts => baseClient -> mutationOpts
P purescript-graphql-client M GraphQL.Client.Types
defQueryOpts :: forall baseClient queryOpts mutationOpts. QueryClient baseClient queryOpts mutationOpts => baseClient -> queryOpts
P purescript-graphql-client M GraphQL.Client.Types
defSubOpts :: forall baseClient opts. SubscriptionClient baseClient opts => baseClient -> opts
P purescript-graphql-client M GraphQL.Client.Types
defWatchOpts :: forall baseClient opts. WatchQueryClient baseClient opts => baseClient -> opts
P purescript-graphql-client M GraphQL.Client.Types
delayTime :: forall nt r ap p. Newtype nt (Variant (delayTime :: AudioParameter p | r)) => ToAudioParameter ap p => ap -> nt
P purescript-ocarina M Ocarina.Properties
discardTupledUnits :: forall a b. DiscardTupledUnits a b => a -> b
P purescript-axon M Axon.Request.Parts.Path
effectful :: forall f output. Effectful f output => f -> output
P purescript-lazy-joe M Lazy.Joe
encode :: forall a o op s. Symbiote a o op s => a -> s
P purescript-symbiote M Test.Serialization.Symbiote.Core
encodeOp :: forall a o op s. Symbiote a o op s => op -> s
P purescript-symbiote M Test.Serialization.Symbiote.Core
float :: forall r a. Decorate Float a => Variadic Float r => a -> r
P purescript-materialize M Materialize.Alignment
frequency :: forall nt r ap p. Newtype nt (Variant (frequency :: AudioParameter p | r)) => ToAudioParameter ap p => ap -> nt
P purescript-ocarina M Ocarina.Properties
fromTagged :: forall tagged untagged. Tagged tagged untagged => tagged -> untagged

Convert a tagged union to an untagged union. E.g.

data IST = IT Int | ST String 
derive instance Generic IST _ 

type ISU = Int |+| String 

ist :: IST
ist = ST "Wurst"

isu :: ISU 
isu = fromTagged ist
-- asOneOf "Wurst"
P purescript-untagged-to-tagged M Data.UntaggedToTagged.Tagged
fromTaggedHelper :: forall taggedGen untagged. TaggedHelper taggedGen untagged => taggedGen -> untagged
P purescript-untagged-to-tagged M Data.UntaggedToTagged.Tagged
gain :: forall nt r ap p. Newtype nt (Variant (gain :: AudioParameter p | r)) => ToAudioParameter ap p => ap -> nt
P purescript-ocarina M Ocarina.Properties
genericAbsurd :: forall a t. Generic t NoConstructors => t -> a

Absurd for any Generic data-type with no constructors.

P purescript-generics-rep-optics M Generic.Optic.Ctor
genericSumToVariantArgImpl :: forall rep out. GenericSumToVariantArg rep out => rep -> out
P purescript-kishimen M Kishimen
getGeometry :: forall m g. HasGeometry m g => m -> g
P purescript-liminal M Classes.HasGeometry
highpass :: forall i highpass. HighpassCtor i highpass => i -> highpass

Change a highpass filter

highpass { freq: 440.0 }
highpass { freq: 440.0, q: 1.0 }
highpass 440.0
P purescript-wags M WAGS.Change.Optionals
highpass :: forall i highpass. HighpassCtor i highpass => i -> highpass

Make a highpass filter

highpass { freq: 440.0 } { osc: sinOsc 440.0 }
highpass { freq: 440.0, q: 1.0 } { osc: sinOsc 440.0 }
highpass 440.0 { osc: sinOsc 440.0 }
P purescript-wags M WAGS.Create.Optionals
highshelf :: forall i highshelf. HighshelfCtor i highshelf => i -> highshelf

Change a highshelf filter

highshelf { freq: 440.0 }
highshelf { freq: 440.0, gain: 1.0 }
highshelf 440.0
P purescript-wags M WAGS.Change.Optionals
highshelf :: forall i highshelf. HighshelfCtor i highshelf => i -> highshelf

Make a highshelf filter

highshelf { freq: 440.0 } { osc: sinOsc 440.0 }
highshelf { freq: 440.0, gain: 1.0 } { osc: sinOsc 440.0 }
highshelf 440.0 { osc: sinOsc 440.0 }
P purescript-wags M WAGS.Create.Optionals
identity :: forall a. a -> a

Returns the value it was given.

identity 1 -- 1

This is the identity function.

P purescript-neon M Neon.Primitive.Function
image :: forall r a. Decorate Image a => Variadic Image r => a -> r
P purescript-materialize M Materialize.Media.Images
init :: forall token a. Init token a => token -> a
P purescript-interactive-data M InteractiveData.Class.InitDataUI
keyNoop :: forall a. Key a => a -> a
P purescript-turbine M Turbine
liftVariadic :: forall a r. Variadic a r => a -> r
P purescript-materialize M Materialize.Markup.Variadic
liftVariadicPreloader :: forall a r. VariadicPreloader a r => a -> r
P purescript-materialize M Materialize.Preloader
loopBuf :: forall i loopBuf. LoopBufCtor i loopBuf => i -> loopBuf

Change a looping buffer.

loopBuf { playbackRate: 1.0 } "track"
loopBuf { playbackRate: 1.0, loopStart: 0.5 } "track"
loopBuf "track"
P purescript-wags M WAGS.Change.Optionals
loopBuf :: forall i loopBuf. LoopBufCtor i loopBuf => i -> loopBuf

Make a looping buffer.

loopBuf { playbackRate: 1.0 } "track"
loopBuf { playbackRate: 1.0, loopStart: 0.5 } "track"
loopBuf "track"
P purescript-wags M WAGS.Create.Optionals
lowpass :: forall i lowpass. LowpassCtor i lowpass => i -> lowpass

Change a lowpass filter

lowpass { freq: 440.0 }
lowpass { freq: 440.0, q: 1.0 }
lowpass 440.0
P purescript-wags M WAGS.Change.Optionals
lowpass :: forall i lowpass. LowpassCtor i lowpass => i -> lowpass

Make a lowpass filter

lowpass { freq: 440.0 } { osc: sinOsc 440.0 }
lowpass { freq: 440.0, q: 1.0 } { osc: sinOsc 440.0 }
lowpass 440.0 { osc: sinOsc 440.0 }
P purescript-wags M WAGS.Create.Optionals
lowshelf :: forall i lowshelf. LowshelfCtor i lowshelf => i -> lowshelf

Change a lowshelf filter

lowshelf { freq: 440.0 }
lowshelf { freq: 440.0, gain: 1.0 }
lowshelf 440.0
P purescript-wags M WAGS.Change.Optionals
lowshelf :: forall i lowshelf. LowshelfCtor i lowshelf => i -> lowshelf

Make a lowshelf filter

lowshelf { freq: 440.0 } { osc: sinOsc 440.0 }
lowshelf { freq: 440.0, gain: 1.0 } { osc: sinOsc 440.0 }
lowshelf 440.0 { osc: sinOsc 440.0 }
P purescript-wags M WAGS.Create.Optionals
makeMicrophone :: forall audio engine. AudioInterpret audio engine => audio -> engine

Make a microphone.

P purescript-wags M WAGS.Interpret
makeSpeaker :: forall audio engine. AudioInterpret audio engine => audio -> engine

Make a node representing the loudspeaker. For sound to be rendered, it must go to a loudspeaker.

P purescript-wags M WAGS.Interpret
makeVariantLabels :: forall a b. HMapWithIndex MakeVariantLabel a b => a -> b
P purescript-framer-motion M Framer.Motion.Types
maximum :: forall a f. Ord a => Foldable1 f => f a -> a
P purescript-value-of-information M Data.Semigroup.Foldable.Extras
minimum :: forall a f. Ord a => Foldable1 f => f a -> a
P purescript-value-of-information M Data.Semigroup.Foldable.Extras
mm :: forall a b. MM a b => a -> b
P purescript-wags M WAGS.Graph.Parameter
mold :: forall e t. Moldable t e => Monoid e => t -> e

Combine all the elements in the moldable type using the action of the monoid

P purescript-moldy M Data.Moldy
negate :: forall a. HasSubtract a => HasZero a => a -> a

Negates the value by subtracting the value from zero.

negate 2 -- -2
P purescript-neon M Neon.Helper

No further results.