This file contains bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
# install cfdof | |
# make the geometry where the gases mix such that inlets with z>0 are Ar, z<0 are Air | |
# adjust rx,ry,rz below | |
# the normal speed-weighted average composition of a rectangle specified below is calculated | |
# | |
# TODO: | |
# - [ ] diffusion: reconstructPar -latestTime, then use the output velocity field with another openfoam solver for the transport equation | |
# - [ ] composition from boundary names, instead of the ad-hoc plane split based on the location of the farthest upstream point in the streamline | |
# - [ ] surrogate model (tgp?) for geometry/flow/model parameter sweeps | |
from typing import cast |
This file contains bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
#' Get the name of a symbol or function call | |
#' | |
#' @param expr An expression to extract the name from. | |
#' @return A character string representing the name of the symbol or function call, or NULL if unsupported. | |
#' @examples | |
#' get_pun_name(quote(x)) # returns "x" | |
#' get_pun_name(quote(f(x))) # returns "f" | |
get_pun_name <- function(expr) { | |
if (is.symbol(expr)) { | |
return(as.character(expr)) |
This file contains bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
/* put this in the same directory as the wx maxima file (.wxmx) | |
load("applyN.mac"); | |
then use applyN as below | |
*/ | |
/* applyN eliminates variables from a set of equations, | |
* while maintaining expressions for the eliminated variables. | |
* | |
* For example: | |
* | |
* r : applyN([v1 + v2 = v4^2], [v1]) |
This file contains bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
{-# LANGUAGE ApplicativeDo #-} | |
{-# LANGUAGE BlockArguments #-} | |
{-# LANGUAGE FlexibleInstances #-} | |
{-# LANGUAGE OverloadedLists #-} | |
{-# LANGUAGE PatternSynonyms #-} | |
-- | | |
-- | |
-- Constructive solid geometry. Not quite FRep or signed distance function. | |
module CSG where |
This file contains bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
# %% | |
using BSplineKit, LinearAlgebra, Optimization | |
using Plots | |
using RCall | |
using SplitApplyCombine | |
using Symbolics | |
@rlibrary ggplot2 | |
import OptimizationOptimisers, DataFrames |
This file contains bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
#!/usr/bin/env -S freecad --console | |
import os | |
import sys | |
import textwrap | |
import FreeCAD | |
import PartDesign | |
import Part | |
import tempfile | |
import shutil |
This file contains bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
{-# LANGUAGE FlexibleInstances #-} | |
{-# LANGUAGE LambdaCase #-} | |
{-# LANGUAGE MultiParamTypeClasses #-} | |
{-# LANGUAGE RankNTypes #-} | |
{-# LANGUAGE TemplateHaskell #-} | |
{-# LANGUAGE TupleSections #-} | |
{-# HLINT ignore "Functor law" #-} | |
{-# LANGUAGE TypeOperators #-} | |
{-# LANGUAGE ViewPatterns #-} | |
{-# OPTIONS_GHC -Wno-unrecognised-pragmas #-} |
This file contains bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
fn bmp_tptp( | |
i2c_ref: Arc<Mutex<I2C0>>, | |
sda: AnyIOPin, | |
scl: AnyIOPin, | |
config: Config, | |
) -> anyhow::Result<[f32; 4]> { | |
use bme280::i2c::BME280; | |
let i2c = i2c_ref.lock().unwrap(); | |
let i2c = RefCell::new(I2cDriver::new(i2c, sda, scl, &config)?); |
This file contains bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
library(pacman) | |
p_load(tidyverse, tictoc, glue, e1071, directlabels, cache) | |
split <- function(x) unlist(strsplit(x, "")) | |
sample(c(letters, split("{}[]()")), 10^5, replace = TRUE) %>% as.list() %>% do.call(str_c, .) %>% writeLines("input0.txt") | |
# map_chr(commands, function(command) readLines(paste0(command, ".hs"))) %>% setNames(commands) %>% deparse %>% writeLines | |
mains <- c( |
This file contains bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
{-# LANGUAGE FlexibleContexts #-} | |
{-# LANGUAGE FlexibleInstances #-} | |
{-# LANGUAGE RankNTypes #-} | |
{-# LANGUAGE ScopedTypeVariables #-} | |
{-# LANGUAGE TypeOperators #-} | |
module VVariable where | |
import Control.Monad | |
import Control.Monad.Trans.Writer |
NewerOlder