|
SecreC 2 language
2.8.0 (2023.09)
Language and standard library reference
|
| ►keydb.sc | Module for working with key-value database |
| Keydb_clean | Removes partially stored keys from the database |
| ScanCursor | Structure for keydb_scan |
| keydb_connect(string) | Connect to a Redis host |
| keydb_del(string) | Delete a value from the database |
| keydb_disconnect(void) | Disconnect from a Redis host |
| keydb_get(string) | Get value stored in database |
| keydb_scan(string) | Start a scan of all the keys stored in the database |
| keydb_scan_cursor_free(cursor) | Deallocates the given cursor without popping all the elements |
| keydb_scan_next(cursor) | Scan the next key from a database |
| keydb_set(string, value) | Store a new value in the database |
| ►matrix.sc | Module with functions for manipulating matrices and vectors |
| colSums | Function for summarizing the columns of a matrix |
| ►crossProduct | Function for finding the cross product of two vectors/matrices |
| crossProduct[[1]] | Function for finding the cross product of two vectors |
| crossProduct[[2]] | Function for finding the cross product of two matrices |
| determinant | Function for finding the determinant of a matrix |
| ►diagMatrixMultiplication | Function for multiplying two diagonal matrices |
| diagMatrixMultiplication[[2]] | Function for multiplying two diagonal matrices |
| diagMatrixMultiplication[[3]] | Function for multiplying two diagonal matrices |
| ►dotProduct | Function for finding the dot product of two vectors/matrices |
| dotProduct[[1]] | Function for finding the dot product of two vectors |
| dotProduct[[2]] | Function for finding the dot product of two matrices |
| leftTransposedMultiplication | Function for multiplying X^T by X |
| ►matrixMultiplication | Function for multiplying two matrices |
| matrixMultiplication[[2]] | Function for multiplying two matrices |
| matrixMultiplication[[3]] | Function for multiplying two matrices |
| rightTransposedMultiplication | Function for multiplying X by X^T |
| rowSums | Function for summing the rows of a matrix |
| transpose | Function for transposing matrices |
| unitMatrix | Function for creating a unit matrix |
| unitVector | Function for finding the unit vector of the input vector |
| vecLength | Function for finding the length of a vector |
| ►oblivious.sc | Module with functions for oblivious tasks |
| ►choose | Function for obliviously choosing one of the inputs |
| choose(multiple conditions) | Function for obliviously choosing pointwise from the inputs |
| choose(single condition) | Function for obliviously choosing one of the inputs |
| matrixLookup | Function for obliviously looking up an element in the input matrix |
| matrixLookupColumn | Function for obliviously looking up a column in a matrix |
| matrixLookupRow | Function for obliviously looking up a row in a matrix |
| matrixUpdate | Function for obliviously updating a value in the input matrix |
| matrixUpdateColumn | Function for obliviously updating a column in the input matrix |
| matrixUpdateRow | Function for obliviously updating a row in the input matrix |
| vectorLookup | Function for obliviously looking up an element in a vector |
| vectorUpdate | Function for obliviously updating an element in the input vector |
| ►profiling.sc | Module for profiling SecreC programs |
| endSection | End a profiling section |
| flushProfileLog | Flush profiling log |
| newSectionType | Create a new profiling section |
| startSection | Start a profiling section |
| ►shared2p.sc | Module with shared2p protection domain functions |
| abs | Function for finding absolute values |
| all | Function for checking if all values of the input vector are true |
| any | Function for checking if any value of the input vector is true |
| argument | Function for accessing the named program arguments of shared2p types |
| bit extraction | Function for converting xor_uint(X) type value to the bit representation |
| choose | Function for obliviously choosing pointwise from the inputs |
| ►max | Functions for finding the maximum value |
| max | Function for finding the maximum element of the input vector |
| max(2 vectors) | Function for finding the pointwise maximum of 2 arrays |
| max(parts) | Function for finding the maximum element in the specified parts of the vector |
| ►min | Functions for finding the minimum value |
| min | Function for finding the minimum element of the input vector |
| min(2 vectors) | Function for finding the pointwise minimum of 2 arrays |
| min(parts) | Function for finding the minimum element in the specified parts of the vector |
| ►product | Functions for finding products |
| product | Function for finding the product of the input vector |
| product(parts) | Function for finding the product of all elements in the input vector in specified parts |
| publish | Function for publishing the named values of shared2p types |
| reshare | Function for converting uint(X) type values to xor_uint(X) and the other way around |
| sign | Function for determining the sign of values |
| ►sum | Functions for finding sums |
| sum | Function for finding the sum of all the elements in a vector |
| sum(parts) | Function for finding the sum of all elements in the input vector in specified parts |
| truePrefixLength | Function for finding how many elements from the start of a vector are true |
| ►shared2p_random.sc | Module with functions for randomizing values |
| randomize | Function for randomizing values |
| ►shared3p.sc | Module with shared3p protection domain functions |
| abs | Function for finding absolute values |
| all | Function for checking if all values of the input vector are true |
| any | Function for checking if any value of the input vector is true |
| argument | Function for accessing the named program arguments of shared3p types |
| bit extraction | Function for converting xor_uint(X) type value to the bit representation |
| ceiling | Functions for rounding a value upwards |
| choose(multiple conditions) | Function for obliviously choosing pointwise from the inputs |
| choose(single condition) | Function for obliviously choosing one of the inputs |
| erf | Function for finding the value of error function |
| exp | Function for finding exp(x) |
| floor | Functions for rounding a value downwards |
| inv | Function for inversing a value |
| invPrefixSum | Fast inverse prefix sum |
| isNegligible | Function for finding if the error is small enough to neglect |
| ln | Function for finding the natural logarithm of a value |
| log | Function for finding the logarithm of a value |
| log10 | Function for finding the base 10 logarithm of a value |
| logGamma | Compute the logarithm of the Gamma function |
| ►max | Functions for finding the maximum value |
| max | Function for finding the maximum element of the input vector |
| max(2 vectors) | Function for finding the pointwise maximum of 2 arrays |
| max(parts) | Function for finding the maximum element in the specified parts of the vector |
| ►min | Functions for finding the minimum value |
| min | Function for finding the minimum element of the input vector |
| min(2 vectors) | Function for finding the pointwise minimum of 2 arrays |
| min(parts) | Function for finding the minimum element in the specified parts of the vector |
| pow | Function for computing values of the power function |
| prefixSum | Fast prefix sum |
| ►product | Functions for finding products |
| product | Function for finding the product of the input vector |
| product(parts) | Function for finding the product of all elements in the input vector in specified parts |
| publish | Function for publishing the named values of shared3p types |
| reshare | Function for converting uint(X) type values to xor_uint(X) and the other way around |
| sign | Function for determining the sign of values |
| sin | Function for finding the sine of a value |
| sqrt | Function for finding the square root of a value |
| ►sum | Functions for finding sums |
| sum | Function for finding the sum of all the elements in a vector |
| sum(parts) | Function for finding the sum of all elements in the input vector in specified parts |
| truePrefixLength | Function for finding how many elements from the start of a vector are true |
| ►shared3p_aes.sc | Module with AES128/192/256 functions |
| aesEncryptEcb | Function for encrypting with AES algorithm |
| aesExpandKey | Function for expanding a randomly generated AES key |
| aesGenkey | Function for generating a key for AES encryption |
| ►shared3p_bloom.sc | Module with bloom filter functions |
| bloomInsertMany | Function for inserting into the bloom filter |
| bloomQueryMany | Function for querying from the bloom filter |
| ►shared3p_join.sc | Module with tableJoinAes128 |
| tableJoinAes128 | Function for joining two Aes128 matrices |
| ►shared3p_keydb.sc | Module for working with key-value databases that contain shared3p shares |
| keydb_get | Get value stored in database |
| keydb_set | Store a new value in the database |
| ►shared3p_matrix.sc | Module with functions for manipulating matrices and vectors (shared3p protection domain) |
| borderingInverse | Function for finding the inverse of a matrix using bordering |
| cholesky | Function for finding the Cholesky decomposition of a matrix |
| choleskyInverse | Function for finding the inverse of a matrix using Cholesky decomposition |
| colSums | Function for summarizing the columns of a matrix |
| ►crossProduct | Function for finding the cross product of two vectors/matrices |
| crossProduct[[1]] | Function for finding the cross product of two vectors |
| crossProduct[[2]] | Function for finding the cross product of two matrices |
| ►dotProduct | Function for finding the dot product of two vectors/matrices |
| dotProduct[[1]] | Function for finding the dot product of two vectors |
| dotProduct[[2]] | Function for finding the dot product of two matrices |
| ►matrixMultiplication | Function for multiplying two matrices |
| matrixMultiplication[[2]] | Function for multiplying two matrices |
| matrixMultiplication[[3]] | Function for multiplying two matrices |
| rowSums | Function for summarizing the rows of a matrix |
| transpose | Function for transposing matrices |
| unitVector | Function for finding the unit vector of the input vector |
| vecLength | Function for finding the length of a vector |
| ►shared3p_oblivious.sc | Module with functions for oblivious tasks (shared3p protection domain) |
| choose | Function for obliviously choosing one of the inputs |
| matrixUpdate | Function for obliviously updating a value in the input matrix |
| matrixUpdateColumn | Function for obliviously updating a column in the input matrix |
| matrixUpdateRow | Function for obliviously updating a row in the input matrix |
| vectorUpdate | Function for obliviously updating an element in the input vector |
| ►shared3p_oblivious_ram.sc | Module with functions for oblivious array lookup and write (ORAM) |
| oramPerformRead | Obliviously reads values from source vector indicated by the indices vector |
| oramPerformWrite | Obliviously replaces (some) values in the original values vector with those contained in the replacement values vector |
| oramPrepareRead | Prepares a sort permutation for oblivious read function oramPerformRead |
| oramPrepareWrite | Prepares a sort permutation for oblivious write function oramPerformWrite |
| ►shared3p_permutation.sc | Module with procedures for permuting vectors and matrices |
| applyPrivatePermutation | Permute a vector according to a private permutation |
| applyPrivatePermutationCols | Permute matrix columns according to a private permutation |
| applyPrivatePermutationRows | Permute matrix rows according to a private permutation |
| applyPublicPermutation | Permute a vector according to a public permutation |
| applyPublicPermutationCols | Permute matrix columns according to a public permutation |
| applyPublicPermutationRows | Permute matrix rows according to a public permutation |
| inversePermutation | Calculate inverse permutation from a permutation |
| privateRandomPermutation | Generates a random private permutation |
| publicRandomPermutation | Generates a random public permutation |
| unapplyPrivatePermutation | Permute a vector according to a private permutation. Reverses the effect of applyPrivatePermutation |
| unapplyPrivatePermutationCols | Permute matrix columns according to a private permutation. Reverses the effect of applyPrivatePermutationCols |
| unapplyPrivatePermutationRows | Permute matrix rows according to a private permutation. Reverses the effect of applyPrivatePermutationRows |
| unapplyPublicPermutation | Permute a vector according to a public permutation. Reverses the effect of applyPublicPermutation |
| unapplyPublicPermutationCols | Permute matrix columns according to a public permutation. Reverses the effect of applyPublicPermutationCols |
| unapplyPublicPermutationRows | Permute matrix rows according to a public permutation. Reverses the effect of applyPublicPermutationRows |
| ►shared3p_random.sc | Module with functions for randomizing values |
| randomize | Function for randomizing values |
| ►shuffle | Functions for shuffling values |
| inverseShuffle(key) | Protocols to undo the shuffle of an array with given key |
| inverseShuffleColumns(key) | Protocols to undo the shuffle of columns in a matrix with given key |
| inverseShuffleRows(key) | Protocols to undo the shuffling of rows in a matrix with given key |
| shuffle | Function for shuffling values |
| shuffle(key) | Protocols to shuffle an array with given key |
| shuffleColumns | Function for shuffling columns in a matrix |
| shuffleColumns(key) | Protocols to shuffle columns in a matrix with given key |
| shuffleRows | Function for shuffling rows in a matrix |
| shuffleRows(key) | Protocols to shuffle rows in a matrix with given key |
| ►shared3p_sort.sc | Module with functions for sorting values |
| ►quicksort | Functions for sorting values using the quicksort algorithm |
| quicksort(matrix) | Functions for sorting rows in a matrix using the quicksort algorithm |
| quicksort(matrix, direction) | Functions for sorting rows in a matrix using the quicksort algorithm |
| quicksort(vector) | Functions for sorting values in a matrix using the quicksort algorithm |
| quicksort(vector, direction) | Functions for sorting values in a matrix using the quicksort algorithm |
| ►radixSort | Functions for sorting values using the radix sort algorithm |
| radixSort(matrix) | Functions for sorting rows in a matrix using the radix sort algorithm |
| radixSort(vector) | Functions for sorting values in a vector using the radix sort algorithm |
| radixSortWithIndex | Function for sorting values in a vector using the radix sort algorithm |
| ►selectK | Functions for selecting k values from a vector/matrix according to an ordering |
| selectK[[1]] | Function for selecting the k smallest elements of a vector |
| selectK[[2]] | Function for selecting k rows from a matrix ordered by a column |
| ►sort | Functions for sorting values |
| sort[[1]] | Function for sorting values in a vector |
| sort[[2]] | Function for sorting rows of a matrix based on values of a column |
| ►sortingNetworkSort | Functions for sorting values with sorting networks |
| sortingNetworkSort[[1]] | Function for sorting values in a vector with sorting network |
| sortingNetworkSort[[2]](1 column) | Function for sorting rows of a matrix based on values of a column |
| sortingNetworkSort[[2]](2 columns) | Function for sorting rows of a matrix based on values of two columns |
| sortingNetworkSort[[2]](3 columns) | Function for sorting rows of a matrix based on values of three columns |
| unsafeSort | Function for sorting a vector if the vector has been shuffled |
| ►shared3p_statistics_common.sc | Module with statistics support functions that are useful primarily in other statistics modules |
| contingencyTable | Create a contingency table |
| cut | Remove unavailable elements |
| cut(multiple samples) | Remove unavailable elements from N samples using the same shuffling key |
| nthElement | Find the nth element in size from a vector |
| ►shared3p_statistics_distribution.sc | Module for visualising distribution of data |
| discreteDistributionCount | Find discrete distribution of an input vector |
| discreteDistributionCount(with stepSize) | Find discrete distribution of an input vector |
| heatmap | Create a heatmap |
| histogram | Create a histogram |
| ►shared3p_statistics_glm.sc | Module for performing regression analysis of generalized linear models |
| GLMAIC | Compute the Akaike information criterion of a generalized linear model |
| GLMAIC(direct) | Compute the Akaike information criterion of a generalized linear model |
| GLMResult | GLM result type |
| constants | Constants |
| generalizedLinearModel | Fitting of generalized linear models |
| generalizedLinearModel(with method parameter) | Fitting of generalized linear models |
| glmStandardErrors | Estimate the standard errors of coefficients of generalized linear models |
| ►shared3p_statistics_outliers.sc | Module with functions for detecting unexpected elements in a dataset |
| outlierDetectionMAD | Outlier detection (using median absolute deviation) |
| outlierDetectionQuantiles | Outlier detection (using quantiles) |
| ►shared3p_statistics_pca.sc | Module for performing principal component analysis |
| PCAResult | Structure containing the results of the analysis. Note that each field only has a reasonable value if it was requested when calling gspca. See also return value constants |
| constants | Constants used to specify which result values are needed from the analysis |
| gspca | Principal component analysis. Note that this method is relatively efficient and precise when a low number of components is required. It uses fixed point numbers internally so it may fail on large inputs due to overflow |
| ►shared3p_statistics_regression.sc | Module for performing regression analysis |
| LOESSResult | LOESS result type |
| constants | Constants used for specifying the method used in linear regression modeling with multiple explanatory variables |
| linearRegression | Fitting of linear models with multiple explanatory variables |
| linearRegressionCG | Fitting of linear models with multiple explanatory variables using the conjugate gradient method |
| loess | LOESS regression with linear local regression |
| simpleLinearRegression | Fitting of simple linear models |
| weightedLinearRegression | Fitting of linear models with observation weights |
| ►shared3p_statistics_summary.sc | Module for finding the main percentiles in statistics |
| MAD | Find the median absolute deviation of a sample |
| MAD(constant) | Find the median absolute deviation of a sample |
| MAD(filter) | Find the median absolute deviation of a filtered sample |
| MAD(filter, constant) | Find the median absolute deviation of a filtered sample |
| covariance | Estimate the Pearson covariance of two samples |
| covariance(filter) | Estimate the Pearson covariance of two samples |
| fiveNumberSummary | Find the minimum, lower quartile, median, upper quartile and maximum of a sample |
| maximum | Find the largest element of a vector |
| mean | Find the mean of a vector |
| mean(filter) | Find the mean of a filtered vector |
| minimum | Find the smallest element of a vector |
| quantiles | Calculate sample quantiles |
| standardDev | Find the standard deviation of a sample |
| standardDev(filter) | Find the standard deviation of a filtered sample |
| variance | Find the variance of a vector |
| variance(filter) | Find the variance of a filtered vector |
| ►shared3p_statistics_testing.sc | Module with statistical hypothesis tests |
| chiSquared | Perform Pearson's chi-squared test of independence |
| chiSquared(goodness of fit with probabilities) | Perform Pearson's chi-squared goodness of fit test |
| chiSquared(goodness of fit) | Perform Pearson's chi-squared goodness of fit test |
| chiSquared(with codebook) | Perform Pearson's chi-squared test of independence |
| combinedDegreesOfFreedom | Approximate the degrees of freedom of a linear combination of independent sample variances |
| constants | Constants used for specifying the alternative hypothesis |
| mannWhitneyU | Perform Mann-Whitney U test |
| multipleTesting | Perform the Benjamini-Hochberg procedure for false discovery rate control |
| pairedTTest | Perform paired t-tests |
| tTest | Perform t-tests |
| tTest(two sample vectors) | Perform t-tests |
| wilcoxonRankSum | Perform Wilcoxon rank sum tests |
| wilcoxonSignedRank | Perform Wilcoxon signed rank tests |
| ►shared3p_string.sc | Module with string functions |
| CRC | Compute CRC hash of the input byte array with given initial hash |
| CRC(0 initial hash) | Compute CRC hash of the input byte array with 0 initial hash |
| cw128GenKey | Generates key for 128-bit Carter-Wegman hash |
| cw128Hash | Hashes values in the input vector into 128-bit hashes using the Carter-Wegman algorithm |
| cw128Hash(key) | Hashes values in the input vector into 128-bit hashes using the Carter-Wegman algorithm |
| murmurHasherVec | MurmurHash |
| ►shared3p_bl_string | Module with functions for bounded length strings |
| BlStringVector | Bounded-length string vector type |
| bl_str | Convert a string to a vector of type xor_uint8 |
| bl_str(struct) | |
| bl_strCat | Function for concatenating two strings |
| bl_strContains | Function for checking if a string contains the given pattern |
| bl_strDeclassify | Function for converting an array of type xor_uint8 to a string |
| bl_strEmpty | Check if a bounded-length string vector contains empty strings |
| bl_strEqPrefixes | Function for checking whether a pattern is a substring of the input string |
| bl_strEquals | Compare two string with each other |
| bl_strFind | Searches for a string in a string vector |
| bl_strHamming | Function for finding the number of bytes that the two input strings differ in |
| bl_strIndexOf | Function for finding the index of a given pattern |
| bl_strIsEmpty | Check if the input string is empty |
| bl_strIsLessThan | Function for comparing two strings alphabetically |
| bl_strLength | Function for finding the length of the given input string |
| bl_strLengthenBound | Increase the bound of a bounded-length string vector |
| bl_strLessThan(parallel) | Compares two bounded-length string vectors point-wise |
| bl_strLevenshtein | Function for finding the edit distance of the two input strings |
| bl_strShuffle | Shuffle a bounded-length string vector |
| bl_strShuffle(key) | Shuffle a bounded-length string vector |
| bl_strTrim | Function for trimming a string |
| bl_strVectorLength | Calculate the length of a bounded-length string vector |
| countZeroes | Count zeroes in the input vector |
| findSortingPermutation | Function for finding a stable sorting permutation |
| tdbReadBlStringColumn | Read a bounded-length string vector from a table_database table |
| tdbVmapAddBlStringType | Add bounded-length string type to a type vector in a table_database vector map |
| tdbVmapAddBlStringValue | Add a bounded-length string vector to a table_database vector map |
| tdbVmapGetBlString | Get bounded-length string vector from a table_database vector map |
| zeroExtend | Extend an input string with zeroes |
| ►shared3p_kl_string | Module with functions for known length strings |
| kl_str | Function for constructing a known length string from given public string |
| kl_strCat | Function for concatenating two strings |
| kl_strContains | Function for checking whether a string contains a pattern or not |
| kl_strDeclassify | Function for declassifying a given XOR shared byte string |
| kl_strEqPrefixes | Function for checking whether a pattern is a substring of the input string |
| kl_strEquals | Function for checking whether two strings are equal |
| kl_strHamming | Function for finding the number of bytes two inputs differ in |
| kl_strIndexOf | Function for finding the index of a given pattern in the input string |
| kl_strIsLessThan | Function for comparing two strings alphabetically |
| kl_strLength | Function for getting the length of a string |
| kl_strLevenshtein | Function for finding the edit distance of two input strings |
| ►shared3p_table_database.sc | Module for working with table databases that contain shared3p shares |
| tdbInsertRow | Insert a row into a table |
| tdbReadColumn(index) | Read a column from a table |
| tdbReadColumn(string) | Read a column from a table |
| tdbTableCreate | Create a table where all columns have the same type |
| tdbVmapAddType | Add a type to a vector in a vector map |
| tdbVmapAddValue(scalar) | Add a scalar value to a vector in a vector map |
| tdbVmapAddValue(vector) | Add a vector to a vector in a vector map |
| tdbVmapAddVlenType | Add a variable length type to a vector in a vector map |
| tdbVmapAddVlenValue | Add a variable length vector to a vector in a vector map |
| tdbVmapGetValue | Get a value from a vector in a vector map |
| tdbVmapGetVlenValue | Get a variable length value from a vector in a vector map |
| ►stdlib.sc | Module with standard general functions |
| abs | Function for finding the absolute value of the input |
| ►all | Function for checking if all elements in a boolean vector are true |
| all | Function for checking if all elements in a boolean vector are true |
| all(parts) | Function for checking if all elements in a boolean vector are true in specified parts |
| ►any | Function for checking if any element in a boolean vector is true |
| any | Function for checking if any element in a boolean vector is true |
| any(parts) | Function for checking if any element in a boolean vector is true in specified parts |
| argument | Function for accessing the named program arguments of public types |
| arrayToString | Function for converting an array to a string |
| erf | Error function |
| exp | Exponential function |
| flatten | Function for converting arrays to 1 dimensional |
| iota | Function for generating a vector of consecutive integers |
| isNegligible | Function for finding if the error is small enough to neglect |
| isPrefixOf | Function for checking if a string is a prefix of another string |
| isSuffixOf | Function for checking if a string is a suffix of another string |
| ln | Natural logarthim |
| ►max | Function for finding the maximum value of the input |
| max | Function for finding the maximum value of the input |
| max(parts) | Function for finding the maximum value of the input in specified parts |
| max(pointwise) | Function for finding the pointwise maximum of two input vectors |
| ►min | Function for finding the minimum values |
| min | Function for finding the minimum value of the input |
| min(parts) | Function for finding the minimum value of the input in specified parts |
| min(pointwise) | Function for finding the pointwise minimum value of the two input vectors |
| print3dArray | Function for printing out 3-dimensional arrays |
| printArray | Function for printing out any dimension arrays |
| printMatrix | Function for printing out matrices |
| printVector | Function for printing out vectors |
| ►product | Function for finding the product of all elements in the input vector |
| product | Function for finding the product of the input vector |
| product(parts) | Function for finding the product of the input vector in parts |
| publish | Function for publishing the named values of public types |
| round | Function for rounding values |
| shapesAreEqual | Function for checking the shape equality of two arrays |
| sin | Function for finding sine |
| sizeof | Function for getting the size of a public value in bytes based on its type |
| ►sort | Public sorting functions |
| sort | Sort a public vector |
| sort(direction) | Sort a public vector |
| sqrt | Function for finding square roots |
| substring | Function for getting a substring of a string |
| ►sum | Function for finding the sum of all elements in the input vector |
| sum | Function for finding the sum of all elements in the input vector |
| sum(parts) | Function for finding the sum of all elements in the input vector in specified parts |
| ►table_database.sc | Module for working with table databases |
| Error codes | Table database error codes |
| tdbCloseConnection | Close connection to a data source |
| tdbGetColumnCount | Get the number of columns in a table |
| tdbGetColumnNames | Get the column names of a table |
| tdbGetColumnTypes | Get the column types of a table |
| tdbGetRowCount | Get the number of rows in a table |
| tdbGetTableNames | Get the names of tables in a data source |
| tdbInsertRow | Insert a row into a table |
| tdbOpenConnection | Open connection to a data source |
| tdbReadColumn(index, value vector) | Read a column from a table |
| tdbReadColumn(index, vector map) | Read a column from a table |
| tdbReadColumn(string, value vector) | Read a column from a table |
| tdbReadColumn(string, vector map) | Read a column from a table |
| tdbTableCreate | Create a table |
| tdbTableCreateWithErrorCode | Create a table |
| tdbTableDelete | Delete a table |
| tdbTableExists | Check if a table exists |
| tdbTableGetAttributes | Get user defined attributes of a table |
| tdbTableSetAttributes | Set user defined attributes of a table |
| tdbVmapAddBatch | Add a batch to a vector map |
| tdbVmapAddIndex | Add an unsigned integer value to a vector in a vector map |
| tdbVmapAddString | Add a string to a vector in a vector map |
| tdbVmapAddType | Add a type to a vector in a vector map |
| tdbVmapAddValue(scalar) | Add a scalar value to a vector in a vector map |
| tdbVmapAddValue(vector) | Add a vector to a vector in a vector map |
| tdbVmapAddVlenType | Add a variable length type to a vector in a vector map |
| tdbVmapAddVlenValue | Add a variable length vector to a vector in a vector map |
| tdbVmapClear | Clears the current batch in a vector map |
| tdbVmapCount | Get the number of vectors in a vector map |
| tdbVmapDelete | Delete a vector map |
| tdbVmapErase | Remove a vector from a vector map |
| tdbVmapGetBatchCount | Get number of batches in a vector map |
| tdbVmapGetIndex | Get an unsigned integer from a string vector in a vector map |
| tdbVmapGetString | Get a string from a string vector in a vector map |
| tdbVmapGetTypeName | Get the name of a type in a type vector in a vector map |
| tdbVmapGetValue | Get a value from a vector in a vector map |
| tdbVmapGetValue(string) | Get a string from a value vector in a vector map |
| tdbVmapGetVlenValue | Get a variable length value from a vector in a vector map |
| tdbVmapNew | Create a vector map |
| tdbVmapReset | Resets the vector map to the initial state |
| tdbVmapSetBatch | Sets the current active batch |
| tdbVmapSetValueAsColumn | Configure the vector map to accept values as column vectors. This can be used to insert multiple rows at a time by providing a vector for each column in the table |
| tdbVmapStringVectorSize | Get the size of a vector in a vector map |
| tdbVmapValueVectorSize | Get the size of a vector in a vector map |
| ►trace.sc | Module for tracing operations in sharemind-trace format |
| traceLoad | Trace table load |
| traceLoad(column) | Trace column load |
| traceOperation | Trace operation |
| traceSave | Trace table save |