Search results
catMaybes :: forall a. Array (Maybe a) -> Array a
Filter an array of optional values, keeping only the elements which contain a value, creating a new array.
catMaybes [Nothing, Just 2, Nothing, Just 4] = [2, 4]
untilJust :: forall a m. MonadRec m => m (Maybe a) -> m a
Supplied computation will be executed repeatedly until it evaluates
to Just value
and then that value
will be returned.
whileJust :: forall a m. Monoid a => MonadRec m => m (Maybe a) -> m a
While supplied computation evaluates to Just _
, it will be
executed repeatedly and results will be combined using monoid instance.
init :: forall a. Partial => Array a -> Array a
Get all but the last element of a non-empty array.
Running time: O(n)
, where n
is the length of the array.
nub :: forall a. Ord a => Array a -> Array a
Remove the duplicates from an array, creating a new array.
nub [1, 2, 1, 3, 3] = [1, 2, 3]
nubEq :: forall a. Eq a => Array a -> Array a
Remove the duplicates from an array, creating a new array.
This less efficient version of nub
only requires an Eq
instance.
nubEq [1, 2, 1, 3, 3] = [1, 2, 3]
reverse :: forall a. Array a -> Array a
Reverse an array, creating a new array.
reverse [] = []
reverse [1, 2, 3] = [3, 2, 1]
sort :: forall a. Ord a => Array a -> Array a
Sort the elements of an array in increasing order, creating a new array. Sorting is stable: the order of equal elements is preserved.
sort [2, -3, 1] = [-3, 1, 2]
tail :: forall a. Partial => Array a -> Array a
Get all but the first element of a non-empty array.
Running time: O(n)
, where n
is the length of the array.
filtered :: forall m a. MonadRec m => MonadGen m => m (Maybe a) -> m a
Creates a generator that repeatedly run another generator until it produces
Just
node. This will never halt if the input generator always produces Nothing
.
compact :: forall f a. Compactable f => f (Maybe a) -> f a
compactDefault :: forall f a. Functor f => Compactable f => f (Maybe a) -> f a
nubHash :: forall a. Hashable a => Array a -> Array a
Remove duplicates from an array.
Like nub
from Data.Array
, but uses a Hashable
constraint
instead of an Ord
constraint.
a_ :: forall html a. Html html => Array (html a) -> html a
Defines a hyperlink [No Attributes]
a_ :: forall html a. Html html => Array (html a) -> html a
Creates a hyperlink element [No Attributes]
abbr_ :: forall html a. Html html => Array (html a) -> html a
Defines an abbreviation [No Attributes]
address_ :: forall html a. Html html => Array (html a) -> html a
Defines contact information for the author/owner of a document [No Attributes]
altGlyph_ :: forall html a. Html html => Array (html a) -> html a
Defines an alternative representation of a glyph in a font [No Attributes]
altGlyphDef_ :: forall html a. Html html => Array (html a) -> html a
Defines a set of glyph substitutions for an altGlyph element [No Attributes]
altGlyphItem_ :: forall html a. Html html => Array (html a) -> html a
Defines a substitution for a specific glyph in an altGlyphDef element [No Attributes]
article_ :: forall html a. Html html => Array (html a) -> html a
Defines self-contained content, like blog posts or news articles [No Attributes]
aside_ :: forall html a. Html html => Array (html a) -> html a
Defines content aside from the content it is placed in [No Attributes]
audio_ :: forall html a. Html html => Array (html a) -> html a
Defines sound content, like music or other audio streams [No Attributes]
b_ :: forall html a. Html html => Array (html a) -> html a
Defines bold text [No Attributes]
bdi_ :: forall html a. Html html => Array (html a) -> html a
Defines text directionality for its children [No Attributes]
bdo_ :: forall html a. Html html => Array (html a) -> html a
Defines text directionality [No Attributes]
blockquote_ :: forall html a. Html html => Array (html a) -> html a
Defines a section that is quoted from another source [No Attributes]
body_ :: forall html a. Html html => Array (html a) -> html a
Defines the document's body [No Attributes]
button_ :: forall html a. Html html => Array (html a) -> html a
Defines a clickable button [No Attributes]
canvas_ :: forall html a. Html html => Array (html a) -> html a
Defines an area that can be used to draw graphics using JavaScript [No Attributes]
caption_ :: forall html a. Html html => Array (html a) -> html a
Defines a table caption [No Attributes]
cite_ :: forall html a. Html html => Array (html a) -> html a
Defines the title of a work [No Attributes]
clipPath_ :: forall html a. Html html => Array (html a) -> html a
Defines a clipping path for an SVG element [No Attributes]
code_ :: forall html a. Html html => Array (html a) -> html a
Defines a piece of computer code [No Attributes]
colgroup_ :: forall html a. Html html => Array (html a) -> html a
Defines attributes for a group of table columns [No Attributes]
colorProfile_ :: forall html a. Html html => Array (html a) -> html a
Defines a color profile for an SVG document [No Attributes]
data__ :: forall html a. Html html => Array (html a) -> html a
Defines machine-readable data [No Attributes]
datalist_ :: forall html a. Html html => Array (html a) -> html a
Defines a list of pre-defined options for input controls [No Attributes]
dd_ :: forall html a. Html html => Array (html a) -> html a
Defines a description/value of a term in a description list [No Attributes]
defs_ :: forall html a. Html html => Array (html a) -> html a
Defines a set of reusable SVG elements [No Attributes]
del_ :: forall html a. Html html => Array (html a) -> html a
Defines text that has been deleted from a document [No Attributes]
desc_ :: forall html a. Html html => Array (html a) -> html a
Defines a description of an SVG element [No Attributes]
details_ :: forall html a. Html html => Array (html a) -> html a
Defines additional details that the user can view or hide [No Attributes]
dfn_ :: forall html a. Html html => Array (html a) -> html a
Defines a definition term [No Attributes]
dialog_ :: forall html a. Html html => Array (html a) -> html a
Defines a dialog box or window [No Attributes]
div_ :: forall html a. Html html => Array (html a) -> html a
Defines a section of a document [No Attributes]
dl_ :: forall html a. Html html => Array (html a) -> html a
Defines a description list [No Attributes]
dt_ :: forall html a. Html html => Array (html a) -> html a
Defines a term in a description list [No Attributes]
em_ :: forall html a. Html html => Array (html a) -> html a
Defines emphasized text [No Attributes]
feMerge_ :: forall html a. Html html => Array (html a) -> html a
Merges multiple input images together [No Attributes]
fieldset_ :: forall html a. Html html => Array (html a) -> html a
Groups related form elements [No Attributes]
figcaption_ :: forall html a. Html html => Array (html a) -> html a
Defines a caption for a <figure> element [No Attributes]
figure_ :: forall html a. Html html => Array (html a) -> html a
Defines self-contained content, like images or diagrams [No Attributes]
filter_ :: forall html a. Html html => Array (html a) -> html a
Defines a filter effect [No Attributes]
footer_ :: forall html a. Html html => Array (html a) -> html a
Defines a footer for a document or section [No Attributes]
foreignObject_ :: forall html a. Html html => Array (html a) -> html a
Inserts a foreign object into an SVG document [No Attributes]
form_ :: forall html a. Html html => Array (html a) -> html a
Defines an HTML form for user input [No Attributes]
g_ :: forall html a. Html html => Array (html a) -> html a
Creates a group of SVG elements [No Attributes]
glyph_ :: forall html a. Html html => Array (html a) -> html a
Defines a single glyph in an SVG font [No Attributes]
h1_ :: forall html a. Html html => Array (html a) -> html a
Defines a heading level 1 [No Attributes]
h2_ :: forall html a. Html html => Array (html a) -> html a
Defines a heading level 2 [No Attributes]
h3_ :: forall html a. Html html => Array (html a) -> html a
Defines a heading level 3 [No Attributes]
h4_ :: forall html a. Html html => Array (html a) -> html a
Defines a heading level 4 [No Attributes]
h5_ :: forall html a. Html html => Array (html a) -> html a
Defines a heading level 5 [No Attributes]
h6_ :: forall html a. Html html => Array (html a) -> html a
Defines a heading level 6 [No Attributes]
hatch_ :: forall html a. Html html => Array (html a) -> html a
Defines a hatching pattern [No Attributes]
head_ :: forall html a. Html html => Array (html a) -> html a
Defines information about the document [No Attributes]
header_ :: forall html a. Html html => Array (html a) -> html a
Defines a header for a document or section [No Attributes]
html_ :: forall html a. Html html => Array (html a) -> html a
Defines the root of an HTML document [No Attributes]
i_ :: forall html a. Html html => Array (html a) -> html a
Defines italic text [No Attributes]
iframe_ :: forall html a. Html html => Array (html a) -> html a
Defines an inline frame for embedding external content [No Attributes]
ins_ :: forall html a. Html html => Array (html a) -> html a
Defines text that has been inserted into a document [No Attributes]
kbd_ :: forall html a. Html html => Array (html a) -> html a
Defines keyboard input [No Attributes]
label_ :: forall html a. Html html => Array (html a) -> html a
Defines a label for an <input> element [No Attributes]
legend_ :: forall html a. Html html => Array (html a) -> html a
Defines a caption for a <fieldset> element [No Attributes]
li_ :: forall html a. Html html => Array (html a) -> html a
Defines a list item [No Attributes]
linearGradient_ :: forall html a. Html html => Array (html a) -> html a
Defines a linear gradient for an SVG element [No Attributes]
main_ :: forall html a. Html html => Array (html a) -> html a
Defines the main content of a document [No Attributes]
map_ :: forall html a. Html html => Array (html a) -> html a
Defines an image map [No Attributes]
mark_ :: forall html a. Html html => Array (html a) -> html a
Defines marked/highlighted text [No Attributes]
marker_ :: forall html a. Html html => Array (html a) -> html a
Defines a marker symbol to be used with a shape or line [No Attributes]
mask_ :: forall html a. Html html => Array (html a) -> html a
Defines a mask for an SVG element [No Attributes]
menu_ :: forall html a. Html html => Array (html a) -> html a
Defines a list/menu of commands [No Attributes]
meter_ :: forall html a. Html html => Array (html a) -> html a
Defines a scalar measurement within a known range [No Attributes]
mpath_ :: forall html a. Html html => Array (html a) -> html a
The mpath element provides a way to animate the motion of an object along a path. [No Attributes]
nav_ :: forall html a. Html html => Array (html a) -> html a
Defines a navigation menu [No Attributes]
noscript_ :: forall html a. Html html => Array (html a) -> html a
Defines an alternate content for users that do not support client-side scripts [No Attributes]
object_ :: forall html a. Html html => Array (html a) -> html a
Defines a container for external application or interactive content [No Attributes]
ol_ :: forall html a. Html html => Array (html a) -> html a
Defines an ordered list [No Attributes]
optgroup_ :: forall html a. Html html => Array (html a) -> html a
Defines a group of related options in a drop-down list [No Attributes]
option_ :: forall html a. Html html => Array (html a) -> html a
Defines an option in a drop-down list [No Attributes]
output_ :: forall html a. Html html => Array (html a) -> html a
Defines the result of a calculation [No Attributes]
p_ :: forall html a. Html html => Array (html a) -> html a
Defines a paragraph [No Attributes]
pattern_ :: forall html a. Html html => Array (html a) -> html a
The pattern element defines a repeating pattern to be used as a fill or stroke. [No Attributes]
picture_ :: forall html a. Html html => Array (html a) -> html a
Defines a container for multiple image resources [No Attributes]
pre_ :: forall html a. Html html => Array (html a) -> html a
Defines preformatted text [No Attributes]
progress_ :: forall html a. Html html => Array (html a) -> html a
Represents the progress of a task [No Attributes]
q_ :: forall html a. Html html => Array (html a) -> html a
Defines a short quotation [No Attributes]
radialGradient_ :: forall html a. Html html => Array (html a) -> html a
The radialGradient element defines a radial gradient to be used as a fill or stroke. [No Attributes]
rb_ :: forall html a. Html html => Array (html a) -> html a
Defines a ruby base (character) for a ruby annotation [No Attributes]
rp_ :: forall html a. Html html => Array (html a) -> html a
Defines what to show in browsers that do not support ruby annotations [No Attributes]
rt_ :: forall html a. Html html => Array (html a) -> html a
Defines a ruby text (annotation) for a ruby annotation [No Attributes]
rtc_ :: forall html a. Html html => Array (html a) -> html a
Defines a ruby text container for a ruby annotation [No Attributes]
ruby_ :: forall html a. Html html => Array (html a) -> html a
Defines a ruby annotation (for East Asian typography) [No Attributes]
s_ :: forall html a. Html html => Array (html a) -> html a
Defines strikethrough text [No Attributes]
samp_ :: forall html a. Html html => Array (html a) -> html a
Defines sample output from a computer program [No Attributes]
script_ :: forall html a. Html html => Array (html a) -> html a
The script element contains script statements. [No Attributes]
section_ :: forall html a. Html html => Array (html a) -> html a
Defines a section in a document [No Attributes]
select_ :: forall html a. Html html => Array (html a) -> html a
Defines a drop-down list [No Attributes]
slot_ :: forall html a. Html html => Array (html a) -> html a
Defines a slot for content in a web component [No Attributes]
small_ :: forall html a. Html html => Array (html a) -> html a
Defines smaller text [No Attributes]
span_ :: forall html a. Html html => Array (html a) -> html a
Defines a small section of text [No Attributes]
strong_ :: forall html a. Html html => Array (html a) -> html a
Defines important text [No Attributes]
style_ :: forall html a. Html html => Array (html a) -> html a
Defines style information for a document [No Attributes]
style_ :: forall html a. Html html => Array (html a) -> html a
The style element contains style information for a document or part of a document. [No Attributes]
sub_ :: forall html a. Html html => Array (html a) -> html a
Defines subscripted text [No Attributes]
summary_ :: forall html a. Html html => Array (html a) -> html a
Defines a visible heading for a <details> element [No Attributes]
sup_ :: forall html a. Html html => Array (html a) -> html a
Defines superscripted text [No Attributes]
svg_ :: forall html a. Html html => Array (html a) -> html a
The svg element is the root element of an SVG document. [No Attributes]
switch_ :: forall html a. Html html => Array (html a) -> html a
The switch element allows conditional processing of SVG elements. [No Attributes]
symbol_ :: forall html a. Html html => Array (html a) -> html a
The symbol element defines a reusable graphic element. [No Attributes]
table_ :: forall html a. Html html => Array (html a) -> html a
Defines a table [No Attributes]
tbody_ :: forall html a. Html html => Array (html a) -> html a
Groups the body content in a table [No Attributes]
td_ :: forall html a. Html html => Array (html a) -> html a
Defines a cell in a table [No Attributes]
template_ :: forall html a. Html html => Array (html a) -> html a
Defines a container for content that should be hidden when the page loads [No Attributes]
text_ :: forall html a. Html html => Array (html a) -> html a
The text element defines a block of text to be drawn. [No Attributes]
textarea_ :: forall html a. Html html => Array (html a) -> html a
Defines a multiline input control [No Attributes]
textPath_ :: forall html a. Html html => Array (html a) -> html a
The textPath element provides a way to align text along a path. [No Attributes]
tfoot_ :: forall html a. Html html => Array (html a) -> html a
Groups the footer content in a table [No Attributes]
th_ :: forall html a. Html html => Array (html a) -> html a
Defines a header cell in a table [No Attributes]
thead_ :: forall html a. Html html => Array (html a) -> html a
Groups the header content in a table [No Attributes]
time_ :: forall html a. Html html => Array (html a) -> html a
Defines a date/time [No Attributes]
title_ :: forall html a. Html html => Array (html a) -> html a
Defines a title for the document [No Attributes]
title_ :: forall html a. Html html => Array (html a) -> html a
The title element provides a title for a document or part of a document. [No Attributes]
tr_ :: forall html a. Html html => Array (html a) -> html a
Defines a row in a table [No Attributes]
tspan_ :: forall html a. Html html => Array (html a) -> html a
The tspan element provides a way to group a portion of text within a larger block of text. [No Attributes]
u_ :: forall html a. Html html => Array (html a) -> html a
Defines underlined text [No Attributes]
ul_ :: forall html a. Html html => Array (html a) -> html a
Defines an unordered list [No Attributes]
use_ :: forall html a. Html html => Array (html a) -> html a
The use element provides a way to reuse a single element and apply transformations to it. [No Attributes]
var_ :: forall html a. Html html => Array (html a) -> html a
Defines a variable [No Attributes]
video_ :: forall html a. Html html => Array (html a) -> html a
Defines a video [No Attributes]
view_ :: forall html a. Html html => Array (html a) -> html a
The view element defines a rectangular portion of the SVG canvas that should be displayed. [No Attributes]
defaultOrr :: forall a m. Plus m => Array (m a) -> m a
orr :: forall m a. MultiAlternative m => Array (m a) -> m a
untilJust :: forall m a. Monad m => m (Maybe a) -> m a
Run the supplied Maybe computation repeatedly until it returns a value. Returns that value.
untilJust :: forall m a. MonadRec m => m (Maybe a) -> m a
Run the supplied "Maybe" computation repeatedly until it returns a value. Returns that value.
createFragmentNode :: forall html message. Array (html message) -> html message
extent :: forall m. Magnitude m => Array m -> Array m
getOutgoingTransactions :: forall a. Directional a => Array a -> Array a
initMonoid :: forall m. Monoid m => Array m -> Array m
lower :: forall a f. Rebuildable f => f (Maybe a) -> f a
nonNull :: forall a t. GraphQLType (t (Maybe a)) => t (Maybe a) -> t a
This function transforms any nullable type into a non-nullable type Doing so also influences the types accepted root value
nonNullableString :: ScalarType String
nonNullableString = nonNull string
Equivalent to JavaScript's new GraphQLNonNull(...)
ordNub :: forall a. Ord a => Array a -> Array a
untilSuccessful :: forall a m. Monad m => m (Maybe a) -> m a
join :: forall a m. Bind m => m (m a) -> m a
Collapse two applications of a monadic type constructor into one.
oneOf :: forall f g a. Foldable f => Plus g => f (g a) -> g a
Combines a collection of elements using the Alt
operation.
singleton :: forall a. a -> Array a
Create an array of one element
singleton 2 = [2]
oneOf :: forall m f a. MonadGen m => Foldable1 f => f (m a) -> m a
Creates a generator that outputs a value chosen from a selection of existing generators with uniform probability.
parOneOf :: forall a t m f. Parallel f m => Alternative f => Foldable t => Functor t => t (m a) -> m a
Race a collection in parallel.
wrapFree :: forall f m a. MonadFree f m => f (m a) -> m a
concat :: forall buf m. MutableBuffer buf m => Array buf -> m buf
Concatenates a list of buffers.
integrateM :: forall a stM m base. Applicative base => MonadBaseControl base m stM => m (stM a) -> m a
Pack a state belonging to m
back into it, instead of throwing it away
restoreM :: forall base m stM a. MonadBaseControl base m stM => base (stM a) -> m a
divisors :: forall a. Semiring a => EuclideanRing a => Eq a => Ord a => a -> Array a
All the divisors of a positive integer
keepLatest :: forall event a. IsEvent event => event (event a) -> event a
from :: forall a t. a -> Array t
Given a pseudoarray, turns it into a proper array
keepLatest :: forall event a. IsEvent event => event (event a) -> event a
join :: forall v m c. HasBind c m => HasIdentity c => ObjectOf c (m v) => m (m v) -> m v
toArrayOf :: forall s t a b @sym lenses. IsSymbol sym => ParseSymbol sym lenses => ConstructBarlow lenses (Forget (Endo Function (List a))) s t a b => s -> Array a
choice :: forall a g f. Foldable f => Alt g => Plus g => f (g a) -> g a
flatten :: forall b a. HasChain a => a (a b) -> a b
Removes a level of nesting from a container.
flatten [[1, 2], [3, 4]] -- [1, 2, 3, 4]
oneOf :: forall a m f. Foldable f => Alternative m => f (m a) -> m a
toArray :: forall a b. HasToArray a b => a -> Array b
warbler :: forall m a. Bind m => m (m a) -> m a
W combinator - warbler - omega
MM
Λ a b . (a → a → b) → a → b
λ f x . f x x
pure :: forall f a. Applicative f => a -> f a
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!"
singleton :: forall f a. Unfoldable1 f => a -> f a
Contain a single value. For example:
singleton "foo" == (NEL.singleton "foo" :: NEL.NonEmptyList String)
proof :: forall a b p. TypeEquals a b => p a -> p b
fold :: forall m. Monoid m => Array m -> m
head :: forall a. Partial => Array a -> a
Get the first element of a non-empty array.
Running time: O(1)
.
last :: forall a. Partial => Array a -> a
Get the last element of a non-empty array.
Running time: O(1)
.
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.
downFrom :: forall a u. Enum a => Unfoldable u => a -> u a
Produces all predecessors of an Enum
value, excluding the start value.
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.
upFrom :: forall a u. Enum a => Unfoldable u => a -> u a
Produces all successors of an Enum
value, excluding the start value.
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
.
coerce :: forall f a b. Contravariant f => Functor f => f a -> f b
throwError :: forall e m a. MonadThrow e m => e -> m a
inj :: forall f g a. Inject f g => f a -> g a
join :: forall f m a. MonadFork f m => f a -> m a
uninterruptible :: forall e f m a. MonadBracket e f m => m a -> m a
cleared :: forall f a b. Filterable f => f a -> f b
Filter out all values.
liftBase :: forall b m a. MonadBase b m => b a -> m a
length :: forall sproxy proxy a b. Length a b => sproxy a -> proxy b
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)
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
folded :: forall event a. IsEvent event => Monoid a => event a -> event a
Combine subsequent events using a Monoid
.
lambek :: forall t f. Recursive t f => Corecursive t f => t -> f t
project :: forall t f. Recursive t f => t -> f t
folded :: forall a event. IsEvent event => Monoid a => event a -> event a
Combine subsequent events using a Monoid
.
sequenceProduct :: forall specI specO f. SequenceProduct specI specO f => specI -> f specO
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.
init :: forall xs ys lproxy. Init xs ys => lproxy xs -> lproxy ys
length :: forall xs r lproxy iproxy. Length xs r => lproxy xs -> iproxy r
pure :: forall v f c. HasPure c f => ObjectOf c v => v -> f v
restoreAfter :: forall m a. MonadCanvasAction m => m a -> m a
Runs save
, then the provided action, then restore
array :: forall t. Corecursive t EJsonF => Array t -> t
bottom1_ :: forall f a. Bottom1_ f => a -> f a
bottom2 :: forall f a b. Bottom2 f a => a -> f b
top1_ :: forall f a. Top1_ f => a -> f a
act :: forall m b a. Mother m => a -> m b
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.
dsingleton :: forall cnt a. Diff cnt => a -> cnt a
fetchAll :: forall m t. MonadCursor m t => m (Array t)
Fetch all remaining rows from the cursor
forever :: forall b a m. Monad m => m a -> m b
fromArray :: forall a b. HasFromArray a b => Array a -> b
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.
lookAhead :: forall m a. LookAheadParsing m => m a -> m a
max :: forall m. Magnitude m => Array m -> m
min :: forall m. Magnitude m => Array m -> m
mockFun :: forall params fun verifyParams m. MockBuilder params fun verifyParams => MonadEffect m => params -> m fun
normalTo :: forall a. EuclideanSpace a => Array a -> a
Builds the n-dimensioned vector needed for the provided array of (n-1) n-dimensioned independant vectors to be a R^n basis.
once :: forall a m. MonadLogic m => m a -> m a
product :: forall a r. Arith a a a r => Array a -> a
product :: forall a. Array a -> a
pure :: forall d a. Syntax d => Eq a => a -> d a
pure :: forall f a. Unital Function Unit Unit f => Functor f => a -> f a
pure :: forall a b. HasPure a => b -> a b
pure :: forall f a. Applicative f => a -> f a
query :: forall m q r. MonadSession m => AsQuery q => FromRows r => q -> m r
Executes a query and unmarshals the result into r
read :: forall box val m. Read box val => MonadDelay m => box -> m val
Read the current value. Will never cause a refresh.
siteClock :: forall s m i c. Site s m i c => s -> m c
siteId :: forall s m i c. Site s m i c => s -> m i
sum :: forall a r. Arith a a a r => Array a -> a
sum :: forall a. Array a -> a
throw :: forall (t10 :: Type -> Type) (t11 :: Type) (a12 :: Type). MonadThrow Error t10 => Show a12 => a12 -> t10 t11
try :: forall m a. Parsing m => m a -> m a
unfold :: forall f a s. Convert s (Statements a) => Unfoldable1 f => s -> f a
unsafeHead :: forall a. Array a -> a
Get the first element in an array. Passing Nothing
to unsafeHead
will throw an error at
runtime.
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
.
from :: forall a rep. Generic a rep => a -> rep
genericNot :: forall a rep. Generic a rep => GenericHeytingAlgebra rep => a -> a
A Generic
implementation of the not
member from the HeytingAlgebra
type class.
genericNot' :: forall a. GenericHeytingAlgebra a => a -> a
negate :: forall a. Ring a => a -> a
negate x
can be used as a shorthand for zero - x
.
not :: forall a. HeytingAlgebra a => a -> a
recip :: forall a. DivisionRing a => a -> a
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
.
to :: forall a rep. Generic a rep => rep -> a
unwrap :: forall t a. Newtype t a => t -> a
wrap :: forall t a. Newtype t a => a -> t
No further results.