Search results

charList :: String -> List Char
P purescript-optlicative M Node.Optlicative.Internal
toChars :: String -> List Char
P purescript-rmrk-parser M Lib.Parsing.Combinators
toChars :: forall f. Unfoldable f => String -> f Char

Turn a String into an Unfoldable container of Chars. For example:

toChars "Foo" == ['F','o','o'] :: Array Char
P purescript-yarn M Data.String.Yarn
crashWith :: forall a. Partial => String -> a

A partial function which crashes on any input with the specified message.

P purescript-partial M Partial
unsafeCrashWith :: forall a. String -> a

A function which crashes with the specified error message.

P purescript-partial M Partial.Unsafe
repeat :: forall a. a -> List a

Create a list by repeating an element

P purescript-lists M Data.List.Lazy
singleton :: forall a. a -> List a

Create a list with a single element.

Running time: O(1)

P purescript-lists M Data.List
singleton :: forall a. a -> List a

Create a list with a single element.

Running time: O(1)

P purescript-lists M Data.List.Lazy
unsafeThrow :: forall a. String -> a

Defined as unsafeThrowException <<< error.

P purescript-exceptions M Effect.Exception.Unsafe
impossible :: forall a. String -> a
P purescript-variant M Data.Variant.Internal
fromString :: forall s. IsString s => String -> s
P purescript-css M CSS.String
url :: forall a. URL a => String -> a
P purescript-css M CSS.Common
fromString :: forall a. IsString a => String -> a
P purescript-yarn M Data.String.Yarn
children :: forall t f. Recursive t f => Foldable f => t -> List t
P purescript-matryoshka M Matryoshka.Fold
readDefault :: forall a. Read a => Zero a => String -> a

Read a value a from a String but fallback on Zero a on failure

P purescript-read M Data.String.Read
text :: forall html a. Html html => String -> html a
P purescript-chameleon M Chameleon.Class
universe :: forall t f. Recursive t f => Foldable f => t -> List t
P purescript-matryoshka M Matryoshka.Fold
unsafeGlobal :: forall t. String -> t

Like global, but for when you're really sure it exists and are willing to tolerate it being quietly undefined (or plan to use the Undef module functions)

P purescript-ffi-simple M FFI.Simple.Globals
stringValue :: forall a. Value a => String -> a
P purescript-markdown M Text.Markdown.SlamDown.Syntax.Value
interp :: forall a. Interp a => String -> a

Use the derived function, i, instead of this function to do string interpolation. Otherwise, you will get a compiler error if the first value is not a String:

interp "a" 42 true == "a42true"
i      "a" 42 true == "a42true"

interp 42 "a" -- does not compile!
i      42 "a" -- compiles!
P purescript-interpolate M Data.Interpolate
string :: forall t. Corecursive t EJsonF => String -> t
P purescript-ejson M Data.Json.Extended
children :: forall a. Node a => a -> List a
P purescript-gametree M Data.GameTree
crash :: forall m a. Testable m => String -> m a
P purescript-elmish-testing-library M Elmish.Test.State
fromDefault :: forall mod m. MonadAff m => String -> m mod

Import a module with a default export

P purescript-lazy-joe M Lazy.Joe
fromString :: forall a. Utf8Encodable a => String -> a
P purescript-crypt-nacl M Crypt.NaCl.Class
fromString :: forall a. Utf8Encodable a => String -> a
P purescript-tweetnacl M Crypt.NaCl.Class
halves :: forall a. Ord a => EuclideanRing a => a -> List a

Produces a list containing the results of halving a number over and over again.

halves 30 == [30,15,7,3,1] halves 128 == [128,64,32,16,8,4,2,1] halves (-10) == [-10,-5,-2,-1]

P purescript-jack M Jack.Shrink
ident :: forall f t. Corecursive t (SqlF f) => String -> t
P purescript-sql-squared M SqlSquared.Constructors
parse :: forall a. Router a => String -> a
P purescript-grain-router M Grain.Router
parseError :: forall e. OwoifyError e => String -> e

Representing general parser error. Currently not used.

P purescript-owoify M Data.Owoify.Internal.Parser.OwoifyParser
parseSlot' :: forall a. EmptyableSlot a => String -> a
P purescript-easy-alexa M EasyAlexa
property' :: forall a. String -> a
P purescript-ffi-utils M FFI.Util
read :: forall a. Read a => Partial => String -> a
P purescript-read-generic M Data.Parse
repeat :: forall a. a -> List a
P purescript-infinite-lists M Data.List.Infinite
require :: forall a. String -> a
P purescript-ffi-utils M FFI.Util
singleton :: forall a. a -> List a

Create a list of one element

Running time: O(1).

P purescript-rrb-list M RRBList
string :: forall t. Corecursive t (SqlF EJsonF) => String -> t
P purescript-sql-squared M SqlSquared.Constructors
unexpected :: forall m a. Parsing m => String -> m a
P purescript-parsers M Text.Parsing.Classes
unsafeUnserialize :: forall m. UnserializeState m => String -> m
P purescript-flame M Flame.Serialization
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
pure :: forall f a. Applicative f => a -> f a
P purescript-prelude M Control.Applicative
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
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
unsafePartial :: forall a. (Partial => a) -> a

Discharge a partiality constraint, unsafely.

P purescript-partial M Partial.Unsafe
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
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
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
throwError :: forall e m a. MonadThrow e m => e -> m a
P purescript-transformers M Control.Monad.Error.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
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
convertTo :: forall t f r. Recursive t f => Corecursive r f => t -> r
P purescript-matryoshka M Matryoshka.Refold
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
lambek :: forall t f. Recursive t f => Corecursive t f => t -> f t
P purescript-matryoshka M Matryoshka.Fold
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
project :: forall t f. Recursive t f => t -> f t
P purescript-matryoshka M Matryoshka.Class.Recursive
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
sequenceProduct :: forall specI specO f. SequenceProduct specI specO f => specI -> f specO
P purescript-classless M Classless
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
pure :: forall v f c. HasPure c f => ObjectOf c v => v -> f v
P purescript-subcategory M Control.Subcategory.Functor.HasPure
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
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
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
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
top1_ :: forall f a. Top1_ f => a -> f a
P purescript-higher-order M Data.Operator.Top
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