artichoke_backend/extn/stdlib/securerandom/
mod.rs

1//! Secure random number generator interface.
2//!
3//! This module implements the [`SecureRandom`] package from the Ruby Standard
4//! Library. It is an interface to secure random number generators which are
5//! suitable for generating session keys in HTTP cookies, etc.
6//!
7//! You can use this library in your application by requiring it:
8//!
9//! ```ruby
10//! require 'securerandom'
11//! ```
12//!
13//! This implementation of `SecureRandom` supports the system RNG via the
14//! [`getrandom`] crate. This implementation does not depend on OpenSSL.
15//!
16//! [`SecureRandom`]: https://ruby-doc.org/stdlib-3.1.2/libdoc/securerandom/rdoc/SecureRandom.html
17//! [`getrandom`]: https://crates.io/crates/getrandom
18
19use crate::convert::implicitly_convert_to_int;
20use crate::extn::prelude::*;
21
22pub(in crate::extn) mod mruby;
23pub(super) mod trampoline;
24
25#[doc(inline)]
26pub use spinoso_securerandom::{
27    ArgumentError, DomainError, Error as SecureRandomError, Max, Rand, RandomBytesError, SecureRandom, alphanumeric,
28    base64, hex, random_bytes, random_number, urlsafe_base64, uuid,
29};
30
31impl From<SecureRandomError> for Error {
32    fn from(err: SecureRandomError) -> Self {
33        match err {
34            SecureRandomError::Argument(err) => err.into(),
35            SecureRandomError::Domain(err) => err.into(),
36            SecureRandomError::RandomBytes(err) => err.into(),
37            // FIXME: this branch allocates when we might be out of memory.
38            SecureRandomError::Memory(_) => NoMemoryError::with_message("out of memory").into(),
39        }
40    }
41}
42
43impl From<ArgumentError> for Error {
44    fn from(err: ArgumentError) -> Self {
45        spinoso_exception::ArgumentError::from(err.message()).into()
46    }
47}
48
49impl From<RandomBytesError> for Error {
50    fn from(err: RandomBytesError) -> Self {
51        RuntimeError::from(err.message()).into()
52    }
53}
54
55impl From<DomainError> for Error {
56    fn from(err: DomainError) -> Self {
57        // TODO: MRI returns `Errno::EDOM` exception class.
58        ArgumentError::from(err.message()).into()
59    }
60}
61
62impl TryConvertMut<Value, Max> for Artichoke {
63    type Error = Error;
64
65    fn try_convert_mut(&mut self, max: Value) -> Result<Max, Self::Error> {
66        let optional: Option<Value> = self.try_convert(max)?;
67        self.try_convert_mut(optional)
68    }
69}
70
71impl TryConvertMut<Option<Value>, Max> for Artichoke {
72    type Error = Error;
73
74    fn try_convert_mut(&mut self, max: Option<Value>) -> Result<Max, Self::Error> {
75        if let Some(max) = max {
76            match max.ruby_type() {
77                Ruby::Fixnum => {
78                    let max = max.try_convert_into(self)?;
79                    Ok(Max::Integer(max))
80                }
81                Ruby::Float => {
82                    let max = max.try_convert_into(self)?;
83                    Ok(Max::Float(max))
84                }
85                _ => {
86                    let max = implicitly_convert_to_int(self, max).map_err(|_| {
87                        let mut message = b"invalid argument - ".to_vec();
88                        message.extend_from_slice(max.inspect(self).as_slice());
89                        spinoso_exception::ArgumentError::from(message)
90                    })?;
91                    Ok(Max::Integer(max))
92                }
93            }
94        } else {
95            Ok(Max::None)
96        }
97    }
98}
99
100impl ConvertMut<Rand, Value> for Artichoke {
101    fn convert_mut(&mut self, from: Rand) -> Value {
102        match from {
103            Rand::Integer(num) => self.convert(num),
104            Rand::Float(num) => self.convert_mut(num),
105        }
106    }
107}