Procedure | Location | Procedure Type | Description |
---|---|---|---|
adjustl | stdlib_string_type | Interface | Left-adjust the character sequence represented by the string. The length of the character sequence remains unchanged. |
adjustr | stdlib_string_type | Interface | Right-adjust the character sequence represented by the string. The length of the character sequence remains unchanged. |
all_close | stdlib_math | Interface | Returns a boolean scalar where two arrays are element-wise equal within a tolerance. (Specification) |
and | stdlib_bitsets | Interface | Sets the bits in |
and_not | stdlib_bitsets | Interface | Sets the bits in |
arange | stdlib_math | Interface |
|
arg | stdlib_math | Interface |
|
arg_select | stdlib_selection | Interface | |
argd | stdlib_math | Interface |
|
argpi | stdlib_math | Interface |
|
assignment(=) | stdlib_bitsets | Interface | Used to define assignment for |
assignment(=) | stdlib_string_type | Interface | Assign a character sequence to a string. |
bidx | stdlib_stringlist_type | Interface | Returns an instance of type 'stringlist_index_type' representing backward index Specifications |
bits | stdlib_bitsets | Function | Returns the number of bit positions in |
cdf_exp | stdlib_stats_distribution_exponential | Interface | Version experimental |
cdf_normal | stdlib_stats_distribution_normal | Interface | Normal Distribution Cumulative Distribution Function (Specification) |
cdf_uniform | stdlib_stats_distribution_uniform | Interface | Get uniform distribution cumulative distribution function (cdf) for integer, real and complex variables. (Specification) |
char | stdlib_string_type | Interface | Return the character sequence represented by the string. |
check | stdlib_error | Subroutine | Checks the value of a logical condition (Specification) |
chomp | stdlib_strings | Interface | Remove trailing characters in set from string. If no character set is provided trailing whitespace is removed. |
clip | stdlib_math | Interface | |
copy_key | stdlib_hashmap_wrappers | Subroutine | Copies the contents of the key, old_key, to the key, new_key (Specifications) |
copy_other | stdlib_hashmap_wrappers | Subroutine | Copies the other data, other_in, to the variable, other_out (Specifications) |
corr | stdlib_stats | Interface | Pearson correlation of array elements (Specification) |
count | stdlib_strings | Interface | Returns the number of times substring 'pattern' has appeared in the input string 'string' Specifications |
cov | stdlib_stats | Interface | Covariance of array elements (Specification) |
cross_product | stdlib_linalg | Interface | Computes the cross product of two vectors, returning a rank-1 and size-3 array (Specification) |
diag | stdlib_linalg | Interface | Creates a diagonal array or extract the diagonal elements of an array (Specification) |
diff | stdlib_math | Interface | Computes differences between adjacent elements of an array. (Specification) |
dist_rand | stdlib_random | Interface | Version experimental |
dlegendre | stdlib_specialfunctions | Interface | First derivative Legendre polynomial |
ends_with | stdlib_strings | Interface | Check whether a string ends with substring or not |
error_handler | stdlib_bitsets | Subroutine | |
error_stop | stdlib_error | Interface | |
extract | stdlib_bitsets | Interface | Creates a new bitset, |
eye | stdlib_linalg | Function | Constructs the identity matrix. (Specification) |
falseloc | stdlib_array | Function | Return the positions of the false elements in array. Specification |
fibonacci_hash | stdlib_hash_64bit | Function | Maps the 64 bit integer |
fibonacci_hash | stdlib_hash_32bit | Function | Maps the 32 bit integer |
fidx | stdlib_stringlist_type | Interface | Returns an instance of type 'stringlist_index_type' representing forward index Specifications |
find | stdlib_strings | Interface | Finds the starting index of substring 'pattern' in the input 'string' Specifications |
fnv_1_hash | stdlib_hash_64bit | Interface | FNV_1 interfaces (Specification) |
fnv_1_hash | stdlib_hash_32bit | Interface | FNV_1 interfaces (Specification) |
fnv_1_hasher | stdlib_hashmap_wrappers | Function | Hashes a key with the FNV_1 algorithm Arguments: key - the key to be hashed |
fnv_1a_hash | stdlib_hash_64bit | Interface | FNV_1A interfaces (Specification) |
fnv_1a_hash | stdlib_hash_32bit | Interface | FNV_1A interfaces (Specification) |
fnv_1a_hasher | stdlib_hashmap_wrappers | Function | Hashes a key with the FNV_1a algorithm (Specifications) |
free_key | stdlib_hashmap_wrappers | Subroutine | Frees the memory in a key (Specifications) |
free_other | stdlib_hashmap_wrappers | Subroutine | Frees the memory in the other data (Specifications) |
gamma | stdlib_specialfunctions_gamma | Interface | Gamma function for integer and complex numbers |
gauss_legendre | stdlib_quadrature | Interface | Computes Gauss-Legendre quadrature nodes and weights. |
gauss_legendre_lobatto | stdlib_quadrature | Interface | Computes Gauss-Legendre-Lobatto quadrature nodes and weights. |
gcd | stdlib_math | Interface | Returns the greatest common divisor of two integers (Specification) |
get | stdlib_hashmap_wrappers | Interface | |
get_stdlib_version | stdlib_version | Subroutine | Getter function to retrieve standard library version |
getline | stdlib_io | Interface | Read a whole line from a formatted unit into a string variable |
iachar | stdlib_string_type | Interface | Code in ASCII collating sequence. |
ichar | stdlib_string_type | Interface | Character-to-integer conversion function. |
index | stdlib_string_type | Interface | Position of a substring within a string. |
is_alpha | stdlib_ascii | Function | Checks whether |
is_alphanum | stdlib_ascii | Function | Checks whether |
is_ascii | stdlib_ascii | Function | Checks whether or not |
is_blank | stdlib_ascii | Function | Checks whether or not |
is_close | stdlib_math | Interface | Returns a boolean scalar/array where two scalar/arrays are element-wise equal within a tolerance. (Specification) |
is_control | stdlib_ascii | Function | Checks whether |
is_diagonal | stdlib_linalg | Interface | Checks if a matrix (rank-2 array) is diagonal (Specification) |
is_digit | stdlib_ascii | Function | Checks whether |
is_graphical | stdlib_ascii | Function | Checks whether or not |
is_hermitian | stdlib_linalg | Interface | Checks if a matrix (rank-2 array) is Hermitian (Specification) |
is_hessenberg | stdlib_linalg | Interface | Checks if a matrix (rank-2 array) is Hessenberg (Specification) |
is_hex_digit | stdlib_ascii | Function | Checks whether |
is_lower | stdlib_ascii | Function | Checks whether |
is_octal_digit | stdlib_ascii | Function | Checks whether |
is_printable | stdlib_ascii | Function | Checks whether or not |
is_punctuation | stdlib_ascii | Function | Checks whether or not |
is_skew_symmetric | stdlib_linalg | Interface | Checks if a matrix (rank-2 array) is skew-symmetric (Specification) |
is_square | stdlib_linalg | Interface | Checks if a matrix (rank-2 array) is square (Specification) |
is_symmetric | stdlib_linalg | Interface | Checks if a matrix (rank-2 array) is symmetric (Specification) |
is_triangular | stdlib_linalg | Interface | Checks if a matrix (rank-2 array) is triangular (Specification) |
is_upper | stdlib_ascii | Function | Checks whether |
is_white | stdlib_ascii | Function | Checks whether or not |
kronecker_product | stdlib_linalg | Interface | Computes the Kronecker product of two arrays of size M1xN1, and of M2xN2, returning an (M1M2)x(N1N2) array (Specification) |
legendre | stdlib_specialfunctions | Interface | Legendre polynomial |
len | stdlib_string_type | Interface | Returns the length of the character sequence represented by the string. |
len_trim | stdlib_string_type | Interface | Returns the length of the character sequence without trailing spaces represented by the string. |
lge | stdlib_string_type | Interface | Lexically compare the order of two character sequences being greater equal, The left-hand side, the right-hand side or both character sequences can be represented by a string. |
lgt | stdlib_string_type | Interface | Lexically compare the order of two character sequences being greater, The left-hand side, the right-hand side or both character sequences can be represented by a string. |
linspace | stdlib_math | Interface | Create rank 1 array of linearly spaced elements If the number of elements is not specified, create an array with size 100. If n is a negative value, return an array with size 0. If n = 1, return an array whose only element is end (Specification) |
lle | stdlib_string_type | Interface | Lexically compare the order of two character sequences being less equal, The left-hand side, the right-hand side or both character sequences can be represented by a string. |
llt | stdlib_string_type | Interface | Lexically compare the order of two character sequences being less, The left-hand side, the right-hand side or both character sequences can be represented by a string. |
load_npy | stdlib_io_npy | Interface | Load multidimensional array in npy format (Specification) |
loadtxt | stdlib_io | Interface | Loads a 2D array from a text file (Specification) |
log_factorial | stdlib_specialfunctions_gamma | Interface | Logarithm of factorial n!, integer variable |
log_gamma | stdlib_specialfunctions_gamma | Interface | Logarithm of gamma function |
log_lower_incomplete_gamma | stdlib_specialfunctions_gamma | Interface | Logarithm of lower incomplete gamma function |
log_upper_incomplete_gamma | stdlib_specialfunctions_gamma | Interface | Logarithm of upper incomplete gamma function |
logspace | stdlib_math | Interface | Create rank 1 array of logarithmically spaced elements from basestart to baseend. If the number of elements is not specified, create an array with size 50. If n is a negative value, return an array with size 0. If n = 1, return an array whose only element is base**end. If no base is specified, logspace will default to using a base of 10 |
lower_incomplete_gamma | stdlib_specialfunctions_gamma | Interface | Lower incomplete gamma function |
mean | stdlib_stats | Interface | Mean of array elements (Specification) |
median | stdlib_stats | Interface | Median of array elements (Specification) |
moment | stdlib_stats | Interface | Central moment of array elements (Specification) |
move | stdlib_string_type | Interface | Moves the allocated character scalar from 'from' to 'to' Specifications |
new_nmhash32_seed | stdlib_hash_32bit | Interface | |
new_nmhash32x_seed | stdlib_hash_32bit | Interface | |
new_pengy_hash_seed | stdlib_hash_64bit | Interface | |
new_spooky_hash_seed | stdlib_hash_64bit | Interface | |
new_water_hash_seed | stdlib_hash_32bit | Interface | |
nmhash32 | stdlib_hash_32bit | Interface | NMHASH32 interfaces (Specification) |
nmhash32x | stdlib_hash_32bit | Interface | NMHASH32X interfaces (Specification) |
odd_random_integer | stdlib_hash_64bit | Subroutine | Returns a 64 bit pseudo random integer, |
odd_random_integer | stdlib_hash_32bit | Subroutine | Returns a 32 bit pseudo random integer, |
open | stdlib_io | Function | Opens a file (Specification) |
operator(+) | stdlib_ansi | Interface | |
operator(//) | stdlib_stringlist_type | Interface | Concatenates stringlist with the input entity Returns a new stringlist Specifications |
operator(//) | stdlib_ansi | Interface | |
operator(//) | stdlib_string_type | Interface | Concatenate two character sequences, the left-hand side, the right-hand side or both character sequences can be represented by a string. |
operator(/=) | stdlib_stringlist_type | Interface | Compares stringlist for inequality with the input entity Returns a logical Specifications |
operator(/=) | stdlib_bitsets | Interface | Returns |
operator(/=) | stdlib_string_type | Interface | Compare two character sequences for inequality, the left-hand side, the right-hand side or both character sequences can be represented by a string. |
operator(<) | stdlib_bitsets | Interface | Returns |
operator(<) | stdlib_string_type | Interface | Compare two character sequences for being less, the left-hand side, the right-hand side or both character sequences can be represented by a string. |
operator(<=) | stdlib_bitsets | Interface | Returns |
operator(<=) | stdlib_string_type | Interface | Compare two character sequences for being less than, the left-hand side, the right-hand side or both character sequences can be represented by a string. |
operator(==) | stdlib_hashmap_wrappers | Interface | |
operator(==) | stdlib_stringlist_type | Interface | Compares stringlist for equality with the input entity Returns a logical Specifications |
operator(==) | stdlib_bitsets | Interface | Returns |
operator(==) | stdlib_string_type | Interface | Compare two character sequences for equality, the left-hand side, the right-hand side or both character sequences can be represented by a string. |
operator(>) | stdlib_bitsets | Interface | Returns |
operator(>) | stdlib_string_type | Interface | Compare two character sequences for being greater, the left-hand side, the right-hand side or both character sequences can be represented by a string. |
operator(>=) | stdlib_bitsets | Interface | Returns |
operator(>=) | stdlib_string_type | Interface | Compare two character sequences for being greater than, the left-hand side, the right-hand side or both character sequences can be represented by a string. |
optval | stdlib_optval | Interface | Fallback value for optional arguments (Specification) |
or | stdlib_bitsets | Interface | Sets the bits in |
ord_sort | stdlib_sorting | Interface | The generic subroutine interface implementing the |
outer_product | stdlib_linalg | Interface | Computes the outer product of two vectors, returning a rank-2 array (Specification) |
padl | stdlib_strings | Interface | Left pad the input string Specifications |
padr | stdlib_strings | Interface | Right pad the input string Specifications |
parse_mode | stdlib_io | Function | |
pdf_exp | stdlib_stats_distribution_exponential | Interface | Version experimental |
pdf_normal | stdlib_stats_distribution_normal | Interface | Normal Distribution Probability Density Function (Specification) |
pdf_uniform | stdlib_stats_distribution_uniform | Interface | Get uniform distribution probability density (pdf) for integer, real and complex variables. (Specification) |
pengy_hash | stdlib_hash_64bit | Interface | PENGY_HASH interfaces (Specification) |
radix_sort | stdlib_sorting | Interface | The generic subroutine interface implementing the LSD radix sort algorithm, see https://en.wikipedia.org/wiki/Radix_sort for more details. It is always O(N) in sorting random data, but need a O(N) buffer. (Specification) |
random_seed | stdlib_random | Interface | Version experimental |
read(formatted) | stdlib_string_type | Interface | Read a character sequence from a connected unformatted unit into the string. |
read(unformatted) | stdlib_string_type | Interface | Read a character sequence from a connected unformatted unit into the string. |
regularized_gamma_p | stdlib_specialfunctions_gamma | Interface | Regularized (normalized) lower incomplete gamma function, P |
regularized_gamma_q | stdlib_specialfunctions_gamma | Interface | Regularized (normalized) upper incomplete gamma function, Q |
repeat | stdlib_string_type | Interface | Repeats the character sequence hold by the string by the number of specified copies. |
replace_all | stdlib_strings | Interface | Replaces all the occurrences of substring 'pattern' in the input 'string' with the replacement 'replacement' Version: experimental |
reverse | stdlib_ascii | Function | Reverse the character order in the input character variable (Specification) |
reverse | stdlib_string_type | Interface | Reverses the character sequence hold by the input string |
rvs_exp | stdlib_stats_distribution_exponential | Interface | Version experimental |
rvs_normal | stdlib_stats_distribution_normal | Interface | Normal Distribution Random Variates (Specification) |
rvs_uniform | stdlib_stats_distribution_uniform | Interface | Get uniformly distributed random variate for integer, real and complex variables. (Specification) |
save_npy | stdlib_io_npy | Interface | Save multidimensional array in npy format (Specification) |
savetxt | stdlib_io | Interface | Saves a 2D array into a text file (Specification) |
scan | stdlib_string_type | Interface | Scan a string for the presence of a set of characters. Scans a string for any of the characters in a set of characters. |
seeded_nmhash32_hasher | stdlib_hashmap_wrappers | Function | Hashes a key with the NMHASH32 hash algorithm (Specifications) |
seeded_nmhash32x_hasher | stdlib_hashmap_wrappers | Function | Hashes a key with the NMHASH32X hash algorithm (Specifications) Arguments: key - the key to be hashed seed - the seed (unused) for the hashing algorithm |
seeded_water_hasher | stdlib_hashmap_wrappers | Function | Hashes a key with the waterhash algorithm (Specifications) |
select | stdlib_selection | Interface | |
set | stdlib_hashmap_wrappers | Interface | |
shuffle | stdlib_stats_distribution_uniform | Interface | Fisher-Yates shuffle algorithm for a rank one array of integer, real and complex variables. (Specification) |
simps | stdlib_quadrature | Interface | Integrates sampled values using Simpson's rule (Specification) |
simps_weights | stdlib_quadrature | Interface | Integrates sampled values using trapezoidal rule weights for given abscissas (Specification) |
slice | stdlib_strings | Interface | Extracts characters from the input string to return a new string |
sort | stdlib_sorting | Interface | The generic subroutine interface implementing the |
sort_index | stdlib_sorting | Interface | The generic subroutine interface implementing the |
spooky_hash | stdlib_hash_64bit | Interface | SPOOKY_HASH interfaces (Specification) |
spookyHash_128 | stdlib_hash_64bit | Interface | |
starts_with | stdlib_strings | Interface | Check whether a string starts with substring or not |
string_type | stdlib_string_type | Interface | Constructor for new string instances |
stringlist_type | stdlib_stringlist_type | Interface | Constructor for stringlist Returns an instance of type stringlist_type Specifications |
strip | stdlib_strings | Interface | Remove leading and trailing whitespace characters. |
to_lower | stdlib_ascii | Function | Convert character variable to lower case (Specification) |
to_lower | stdlib_string_type | Interface | Returns the lowercase version of the character sequence hold by the input string |
to_sentence | stdlib_ascii | Function | Converts character sequence to sentence case (Specification) |
to_sentence | stdlib_string_type | Interface | Returns the sentencecase version of the character sequence hold by the input string |
to_string | stdlib_ansi | Interface | |
to_string | stdlib_strings | Interface | Format or transfer other types as a string. (Specification) |
to_title | stdlib_ascii | Function | Converts character sequence to title case (Specification) |
to_title | stdlib_string_type | Interface | Returns the titlecase version of the character sequence hold by the input string |
to_upper | stdlib_ascii | Function | Convert character variable to upper case (Specification) |
to_upper | stdlib_string_type | Interface | Returns the uppercase version of the character sequence hold by the input string |
trace | stdlib_linalg | Interface | Computes the trace of a matrix (Specification) |
trapz | stdlib_quadrature | Interface | Integrates sampled values using trapezoidal rule (Specification) |
trapz_weights | stdlib_quadrature | Interface | Integrates sampled values using trapezoidal rule weights for given abscissas (Specification) |
trim | stdlib_string_type | Interface | Returns the character sequence hold by the string without trailing spaces. |
trueloc | stdlib_array | Function | Return the positions of the true elements in array. Specification |
universal_mult_hash | stdlib_hash_64bit | Function | Uses the "random" odd 64 bit integer |
universal_mult_hash | stdlib_hash_32bit | Function | Uses the "random" odd 32 bit integer |
upper_incomplete_gamma | stdlib_specialfunctions_gamma | Interface | Upper incomplete gamma function |
var | stdlib_stats | Interface | Variance of array elements (Specification) |
verify | stdlib_string_type | Interface | Scan a string for the absence of a set of characters. Verifies that all the characters in string belong to the set of characters in set. |
water_hash | stdlib_hash_32bit | Interface | WATER_HASH interfaces (Specification) |
write(formatted) | stdlib_string_type | Interface | Write the character sequence hold by the string to a connected formatted unit. |
write(unformatted) | stdlib_string_type | Interface | Write the character sequence hold by the string to a connected unformatted unit. |
xor | stdlib_bitsets | Interface | Sets the bits in |
zfill | stdlib_strings | Interface | Left pad the input string with zeros. Specifications |