tomo/stdlib/integers.h

380 lines
13 KiB
C

#pragma once
// Integer type infos and methods
#include <stdbool.h>
#include <stdint.h>
#include <stdlib.h>
#include <gmp.h>
#include "datatypes.h"
#include "nums.h"
#include "stdlib.h"
#include "types.h"
#include "util.h"
#define Int64_t int64_t
#define Int32_t int32_t
#define Int16_t int16_t
#define Int8_t int8_t
#define I64(x) ((int64_t)x)
#define I32(x) ((int32_t)x)
#define I16(x) ((int16_t)x)
#define I8(x) ((int8_t)x)
#define DEFINE_INT_TYPE(c_type, type_name, to_attr) \
typedef struct { \
c_type i; \
bool is_none:1; \
} Optional ## type_name ## _t; \
Text_t type_name ## $as_text(const void *i, bool colorize, const TypeInfo_t *type); \
PUREFUNC int32_t type_name ## $compare(const void *x, const void *y, const TypeInfo_t *type); \
PUREFUNC bool type_name ## $equal(const void *x, const void *y, const TypeInfo_t *type); \
Text_t type_name ## $format(c_type i, Int_t digits); \
Text_t type_name ## $hex(c_type i, Int_t digits, bool uppercase, bool prefix); \
Text_t type_name ## $octal(c_type i, Int_t digits, bool prefix); \
Array_t type_name ## $bits(c_type x); \
to_attr Range_t type_name ## $to(c_type from, c_type to); \
PUREFUNC Optional ## type_name ## _t type_name ## $parse(Text_t text); \
MACROLIKE PUREFUNC c_type type_name ## $clamped(c_type x, c_type min, c_type max) { \
return x < min ? min : (x > max ? max : x); \
} \
extern const c_type type_name ## $min, type_name##$max; \
extern const TypeInfo_t type_name ## $info; \
MACROLIKE c_type type_name ## $divided_by(c_type D, c_type d) { \
c_type q = D/d, r = D%d; \
q -= (r < 0) * (2*(d > 0) - 1); \
return q; \
} \
MACROLIKE c_type type_name ## $modulo(c_type D, c_type d) { \
c_type r = D%d; \
r -= (r < 0) * (2*(d < 0) - 1) * d; \
return r; \
} \
MACROLIKE c_type type_name ## $modulo1(c_type D, c_type d) { \
return type_name ## $modulo(D-1, d) + 1; \
} \
MACROLIKE PUREFUNC c_type type_name ## $wrapping_plus(c_type x, c_type y) { \
return (c_type)((u##c_type)x + (u##c_type)y); \
} \
MACROLIKE PUREFUNC c_type type_name ## $wrapping_minus(c_type x, c_type y) { \
return (c_type)((u##c_type)x + (u##c_type)y); \
} \
MACROLIKE PUREFUNC c_type type_name ## $unsigned_left_shifted(c_type x, c_type y) { \
return (c_type)((u##c_type)x << y); \
} \
MACROLIKE PUREFUNC c_type type_name ## $unsigned_right_shifted(c_type x, c_type y) { \
return (c_type)((u##c_type)x >> y); \
}
DEFINE_INT_TYPE(int64_t, Int64, __attribute__(()))
DEFINE_INT_TYPE(int32_t, Int32, CONSTFUNC)
DEFINE_INT_TYPE(int16_t, Int16, CONSTFUNC)
DEFINE_INT_TYPE(int8_t, Int8, CONSTFUNC)
#undef DEFINE_INT_TYPE
#define NONE_INT64 ((OptionalInt64_t){.is_none=true})
#define NONE_INT32 ((OptionalInt32_t){.is_none=true})
#define NONE_INT16 ((OptionalInt16_t){.is_none=true})
#define NONE_INT8 ((OptionalInt8_t){.is_none=true})
#define Int64$abs(...) I64(labs(__VA_ARGS__))
#define Int32$abs(...) I32(abs(__VA_ARGS__))
#define Int16$abs(...) I16(abs(__VA_ARGS__))
#define Int8$abs(...) I8(abs(__VA_ARGS__))
void Int64$serialize(const void *obj, FILE *out, Table_t*, const TypeInfo_t*);
void Int64$deserialize(FILE *in, void *outval, Array_t*, const TypeInfo_t*);
void Int32$serialize(const void *obj, FILE *out, Table_t*, const TypeInfo_t*);
void Int32$deserialize(FILE *in, void *outval, Array_t*, const TypeInfo_t*);
#define OptionalInt_t Int_t
Text_t Int$as_text(const void *i, bool colorize, const TypeInfo_t *type);
Text_t Int$value_as_text(Int_t i);
PUREFUNC uint64_t Int$hash(const void *x, const TypeInfo_t *type);
PUREFUNC int32_t Int$compare(const void *x, const void *y, const TypeInfo_t *type);
PUREFUNC int32_t Int$compare_value(const Int_t x, const Int_t y);
PUREFUNC bool Int$equal(const void *x, const void *y, const TypeInfo_t *type);
PUREFUNC bool Int$equal_value(const Int_t x, const Int_t y);
Text_t Int$format(Int_t i, Int_t digits);
Text_t Int$hex(Int_t i, Int_t digits, bool uppercase, bool prefix);
Text_t Int$octal(Int_t i, Int_t digits, bool prefix);
PUREFUNC Range_t Int$to(Int_t from, Int_t to);
OptionalInt_t Int$from_str(const char *str);
OptionalInt_t Int$parse(Text_t text);
Int_t Int$abs(Int_t x);
Int_t Int$power(Int_t base, Int_t exponent);
OptionalInt_t Int$sqrt(Int_t i);
#define BIGGEST_SMALL_INT ((1<<29)-1)
#define Int$from_mpz(mpz) (\
mpz_cmpabs_ui(mpz, BIGGEST_SMALL_INT) <= 0 ? ( \
(Int_t){.small=(mpz_get_si(mpz)<<2)|1} \
) : ( \
(Int_t){.big=memcpy(new(mpz_t), &mpz, sizeof(mpz_t))} \
))
#define mpz_init_set_int(mpz, i) do { \
if likely ((i).small & 1) mpz_init_set_si(mpz, (i).small >> 2); \
else mpz_init_set(mpz, *(i).big); \
} while (0)
#define I(i) ((int64_t)(i) == (int32_t)(i) ? ((Int_t){.small=(int64_t)((uint64_t)(i)<<2)|1}) : Int64_to_Int(i))
#define I_small(i) ((Int_t){.small=(int64_t)((uint64_t)(i)<<2)|1})
#define I_is_zero(i) ((i).small == 1)
Int_t Int$slow_plus(Int_t x, Int_t y);
Int_t Int$slow_minus(Int_t x, Int_t y);
Int_t Int$slow_times(Int_t x, Int_t y);
Int_t Int$slow_divided_by(Int_t x, Int_t y);
Int_t Int$slow_modulo(Int_t x, Int_t y);
Int_t Int$slow_modulo1(Int_t x, Int_t y);
Int_t Int$slow_left_shifted(Int_t x, Int_t y);
Int_t Int$slow_right_shifted(Int_t x, Int_t y);
Int_t Int$slow_bit_and(Int_t x, Int_t y);
Int_t Int$slow_bit_or(Int_t x, Int_t y);
Int_t Int$slow_bit_xor(Int_t x, Int_t y);
Int_t Int$slow_negative(Int_t x);
Int_t Int$slow_negated(Int_t x);
bool Int$is_prime(Int_t x, Int_t reps);
Int_t Int$next_prime(Int_t x);
Int_t Int$prev_prime(Int_t x);
extern const TypeInfo_t Int$info;
MACROLIKE PUREFUNC Int_t Int$clamped(Int_t x, Int_t low, Int_t high) {
return (Int$compare(&x, &low, &Int$info) <= 0) ? low : (Int$compare(&x, &high, &Int$info) >= 0 ? high : x);
}
// Fast-path inline versions for the common case where integer arithmetic is
// between two small ints.
MACROLIKE Int_t Int$plus(Int_t x, Int_t y) {
const int64_t z = (int64_t)((uint64_t)x.small + (uint64_t)y.small);
if likely ((z|2) == (int32_t)z)
return (Int_t){.small=(z-1)};
return Int$slow_plus(x, y);
}
MACROLIKE Int_t Int$minus(Int_t x, Int_t y) {
const int64_t z = (int64_t)(((uint64_t)x.small ^ 3) - (uint64_t)y.small);
if likely ((z & ~2) == (int32_t)z)
return (Int_t){.small=z};
return Int$slow_minus(x, y);
}
MACROLIKE Int_t Int$times(Int_t x, Int_t y) {
if likely ((x.small & y.small) & 1) {
const int64_t z = (x.small>>1) * (y.small>>1);
if likely (z == (int32_t)z)
return (Int_t){.small=z+1};
}
return Int$slow_times(x, y);
}
MACROLIKE Int_t Int$divided_by(Int_t x, Int_t y) {
if likely (x.small & y.small & 1) {
// Euclidean division, see: https://www.microsoft.com/en-us/research/wp-content/uploads/2016/02/divmodnote-letter.pdf
const int64_t D = (x.small>>2);
const int64_t d = (y.small>>2);
int64_t q = D/d, r = D%d;
q -= (r < 0) * (2*(d > 0) - 1);
if likely (q == (int32_t)q)
return (Int_t){.small=(q<<2)|1};
}
return Int$slow_divided_by(x, y);
}
MACROLIKE Int_t Int$modulo(Int_t x, Int_t y) {
if likely (x.small & y.small & 1) {
// Euclidean modulus, see: https://www.microsoft.com/en-us/research/wp-content/uploads/2016/02/divmodnote-letter.pdf
const int64_t D = (x.small>>2);
const int64_t d = (y.small>>2);
int64_t r = D%d;
r -= (r < 0) * (2*(d < 0) - 1) * d;
return (Int_t){.small=(r<<2)|1};
}
return Int$slow_modulo(x, y);
}
MACROLIKE Int_t Int$modulo1(Int_t x, Int_t y) {
if likely (x.small & y.small & 1) {
// Euclidean modulus, see: https://www.microsoft.com/en-us/research/wp-content/uploads/2016/02/divmodnote-letter.pdf
const int64_t D = (x.small>>2)-1;
const int64_t d = (y.small>>2);
int64_t r = D%d;
r -= (r < 0) * (2*(d < 0) - 1) * d;
return (Int_t){.small=((r+1)<<2)|1};
}
return Int$slow_modulo1(x, y);
}
MACROLIKE Int_t Int$left_shifted(Int_t x, Int_t y) {
if likely (x.small & y.small & 1) {
const int64_t z = ((x.small>>2) << (y.small>>2))<<2;
if likely (z == (int32_t)z)
return (Int_t){.small=z+1};
}
return Int$slow_left_shifted(x, y);
}
MACROLIKE Int_t Int$right_shifted(Int_t x, Int_t y) {
if likely (x.small & y.small & 1) {
const int64_t z = ((x.small>>2) >> (y.small>>2))<<2;
if likely (z == (int32_t)z)
return (Int_t){.small=z+1};
}
return Int$slow_right_shifted(x, y);
}
MACROLIKE Int_t Int$bit_and(Int_t x, Int_t y) {
const int64_t z = x.small & y.small;
if likely (z & 1)
return (Int_t){.small=z};
return Int$slow_bit_and(x, y);
}
MACROLIKE Int_t Int$bit_or(Int_t x, Int_t y) {
if likely (x.small & y.small & 1)
return (Int_t){.small=(x.small | y.small)};
return Int$slow_bit_or(x, y);
}
MACROLIKE Int_t Int$bit_xor(Int_t x, Int_t y) {
if likely (x.small & y.small & 1)
return (Int_t){.small=(x.small ^ y.small) | 1};
return Int$slow_bit_xor(x, y);
}
MACROLIKE Int_t Int$negated(Int_t x) {
if likely (x.small & 1)
return (Int_t){.small=(~x.small) ^ 3};
return Int$slow_negated(x);
}
MACROLIKE Int_t Int$negative(Int_t x) {
if likely (x.small & 1)
return (Int_t){.small=((-((x.small)>>2))<<2) | 1};
return Int$slow_negative(x);
}
MACROLIKE PUREFUNC bool Int$is_negative(Int_t x) {
if likely (x.small & 1)
return x.small < 0;
return Int$compare_value(x, I_small(0)) < 0;
}
// Conversion functions:
MACROLIKE Int_t Int64_to_Int(int64_t i)
{
int64_t z = i<<2;
if likely (z == (int32_t)z)
return (Int_t){.small=z+1};
mpz_t result;
mpz_init_set_si(result, i);
return Int$from_mpz(result);
}
#define Int32_to_Int(i, ...) Int64_to_Int(i)
#define Int16_to_Int(i, ...) Int64_to_Int(i)
#define Int8_to_Int(i, ...) Int64_to_Int(i)
#define Int32_to_Int64(i, ...) (Int64_t)(i)
#define Int16_to_Int64(i, ...) (Int64_t)(i)
#define Int8_to_Int64(i, ...) (Int64_t)(i)
#define Int16_to_Int32(i, ...) (Int32_t)(i)
#define Int8_to_Int32(i, ...) (Int32_t)(i)
#define Int8_to_Int16(i, ...) (Int16_t)(i)
MACROLIKE PUREFUNC Int64_t Int_to_Int64(Int_t i, bool truncate) {
if likely (i.small & 1)
return (int64_t)(i.small >> 2);
if (!truncate && unlikely(!mpz_fits_slong_p(*i.big)))
fail("Integer is too big to fit in a 64-bit integer!");
return mpz_get_si(*i.big);
}
MACROLIKE PUREFUNC Int32_t Int_to_Int32(Int_t i, bool truncate) {
int64_t i64 = Int_to_Int64(i, truncate);
int32_t i32 = (int32_t)i64;
if (!truncate && unlikely(i64 != i32))
fail("Integer is too big to fit in a 32-bit integer!");
return i32;
}
MACROLIKE PUREFUNC Int16_t Int_to_Int16(Int_t i, bool truncate) {
int64_t i64 = Int_to_Int64(i, truncate);
int16_t i16 = (int16_t)i64;
if (!truncate && unlikely(i64 != i16))
fail("Integer is too big to fit in a 16-bit integer!");
return i16;
}
MACROLIKE PUREFUNC Int8_t Int_to_Int8(Int_t i, bool truncate) {
int64_t i64 = Int_to_Int64(i, truncate);
int8_t i8 = (int8_t)i64;
if (!truncate && unlikely(i64 != i8))
fail("Integer is too big to fit in an 8-bit integer!");
return i8;
}
MACROLIKE PUREFUNC Int_t Num_to_Int(double n)
{
mpz_t result;
mpz_init_set_d(result, n);
return Int$from_mpz(result);
}
MACROLIKE PUREFUNC double Int_to_Num(Int_t i)
{
if likely (i.small & 1)
return (double)(i.small >> 2);
return mpz_get_d(*i.big);
}
#define Int_to_Num32(i) (Num32_t)Int_to_Num(i)
#define CONVERSION_FUNC(hi, lo) \
MACROLIKE PUREFUNC int##lo##_t Int##hi##_to_Int##lo(int##hi##_t i, bool truncate) { \
if (!truncate && unlikely(i != (int##lo##_t)i)) \
fail("Cannot truncate the Int" #hi " %ld to an Int" #lo, (int64_t)i); \
return (int##lo##_t)i; \
}
CONVERSION_FUNC(64, 32)
CONVERSION_FUNC(64, 16)
CONVERSION_FUNC(64, 8)
CONVERSION_FUNC(32, 16)
CONVERSION_FUNC(32, 8)
CONVERSION_FUNC(16, 8)
#undef CONVERSION_FUNC
#pragma GCC diagnostic push
#pragma GCC diagnostic ignored "-Wfloat-equal"
#define CONVERSION_FUNC(num, int_type) \
MACROLIKE PUREFUNC int_type##_t num##_to_##int_type(num##_t n, bool truncate) { \
num##_t rounded = (num##_t)round((double)n); \
if (!truncate && unlikely((num##_t)(int_type##_t)rounded != rounded)) \
fail("Cannot truncate the " #num " %g to an " #int_type, (double)rounded); \
return (int_type##_t)rounded; \
} \
MACROLIKE PUREFUNC num##_t int_type##_to_##num(int_type##_t n) { \
return (num##_t)n; \
}
CONVERSION_FUNC(Num, Int64)
CONVERSION_FUNC(Num, Int32)
CONVERSION_FUNC(Num, Int16)
CONVERSION_FUNC(Num, Int8)
CONVERSION_FUNC(Num32, Int64)
CONVERSION_FUNC(Num32, Int32)
CONVERSION_FUNC(Num32, Int16)
CONVERSION_FUNC(Num32, Int8)
#pragma GCC diagnostic pop
#undef CONVERSION_FUNC
// vim: ts=4 sw=0 et cino=L2,l1,(0,W4,m1,\:0