WOLFRAM SYSTEM MODELER

PartialTwoPhaseMedium

Base class for two phase medium of one substance

Package Contents

ThermodynamicState

Thermodynamic state of two phase medium

BaseProperties

Base properties (p, d, T, h, u, R_s, MM, sat) of two phase medium

setDewState

Return the thermodynamic state on the dew line

setBubbleState

Return the thermodynamic state on the bubble line

setState_dTX

Return thermodynamic state as function of d, T and composition X or Xi

setState_phX

Return thermodynamic state as function of p, h and composition X or Xi

setState_psX

Return thermodynamic state as function of p, s and composition X or Xi

setState_pTX

Return thermodynamic state as function of p, T and composition X or Xi

setSat_T

Return saturation property record from temperature

setSat_p

Return saturation property record from pressure

bubbleEnthalpy

Return bubble point specific enthalpy

dewEnthalpy

Return dew point specific enthalpy

bubbleEntropy

Return bubble point specific entropy

dewEntropy

Return dew point specific entropy

bubbleDensity

Return bubble point density

dewDensity

Return dew point density

saturationPressure

Return saturation pressure

saturationTemperature

Return saturation temperature

saturationPressure_sat

Return saturation pressure

saturationTemperature_sat

Return saturation temperature

saturationTemperature_derp

Return derivative of saturation temperature w.r.t. pressure

saturationTemperature_derp_sat

Return derivative of saturation temperature w.r.t. pressure

surfaceTension

Return surface tension sigma in the two phase region

molarMass

Return the molar mass of the medium

dBubbleDensity_dPressure

Return bubble point density derivative

dDewDensity_dPressure

Return dew point density derivative

dBubbleEnthalpy_dPressure

Return bubble point specific enthalpy derivative

dDewEnthalpy_dPressure

Return dew point specific enthalpy derivative

specificEnthalpy_pTX

Return specific enthalpy from pressure, temperature and mass fraction

temperature_phX

Return temperature from p, h, and X or Xi

density_phX

Return density from p, h, and X or Xi

temperature_psX

Return temperature from p, s, and X or Xi

density_psX

Return density from p, s, and X or Xi

specificEnthalpy_psX

Return specific enthalpy from p, s, and X or Xi

setState_pT

Return thermodynamic state from p and T

setState_ph

Return thermodynamic state from p and h

setState_ps

Return thermodynamic state from p and s

setState_dT

Return thermodynamic state from d and T

setState_px

Return thermodynamic state from pressure and vapour quality

setState_Tx

Return thermodynamic state from temperature and vapour quality

vapourQuality

Return vapour quality

density_ph

Return density from p and h

temperature_ph

Return temperature from p and h

pressure_dT

Return pressure from d and T

specificEnthalpy_dT

Return specific enthalpy from d and T

specificEnthalpy_ps

Return specific enthalpy from p and s

temperature_ps

Return temperature from p and s

density_ps

Return density from p and s

specificEnthalpy_pT

Return specific enthalpy from p and T

density_pT

Return density from p and T

Package Constants (23)

ThermoStates

Value:

Type: IndependentVariables

Description: Enumeration type for independent variables

mediumName

Value: "unusablePartialMedium"

Type: String

Description: Name of the medium

substanceNames

Value: {mediumName}

Type: String[:]

Description: Names of the mixture substances. Set substanceNames={mediumName} if only one substance.

extraPropertiesNames

Value: fill("", 0)

Type: String[:]

Description: Names of the additional (extra) transported properties. Set extraPropertiesNames=fill("",0) if unused

singleState

Value:

Type: Boolean

Description: = true, if u and d are not a function of pressure

reducedX

Value: true

Type: Boolean

Description: = true if medium contains the equation sum(X) = 1.0; set reducedX=true if only one substance (see docu for details)

fixedX

Value: true

Type: Boolean

Description: = true if medium contains the equation X = reference_X

reference_p

Value: 101325

Type: AbsolutePressure (Pa)

Description: Reference pressure of Medium: default 1 atmosphere

reference_T

Value: 298.15

Type: Temperature (K)

Description: Reference temperature of Medium: default 25 deg Celsius

reference_X

Value: fill(1 / nX, nX)

Type: MassFraction[nX] (kg/kg)

Description: Default mass fractions of medium

p_default

Value: 101325

Type: AbsolutePressure (Pa)

Description: Default value for pressure of medium (for initialization)

T_default

Value: Modelica.Units.Conversions.from_degC(20)

Type: Temperature (K)

Description: Default value for temperature of medium (for initialization)

h_default

Value: specificEnthalpy_pTX(p_default, T_default, X_default)

Type: SpecificEnthalpy (J/kg)

Description: Default value for specific enthalpy of medium (for initialization)

X_default

Value: reference_X

Type: MassFraction[nX] (kg/kg)

Description: Default value for mass fractions of medium (for initialization)

C_default

Value: fill(0, nC)

Type: ExtraProperty[nC]

Description: Default value for trace substances of medium (for initialization)

nS

Value: size(substanceNames, 1)

Type: Integer

Description: Number of substances

nX

Value: nS

Type: Integer

Description: Number of mass fractions

nXi

Value: if fixedX then 0 else if reducedX then nS - 1 else nS

Type: Integer

Description: Number of structurally independent mass fractions (see docu for details)

nC

Value: size(extraPropertiesNames, 1)

Type: Integer

Description: Number of extra (outside of standard mass-balance) transported properties

C_nominal

Value: 1.0e-6 * ones(nC)

Type: Real[nC]

Description: Default for the nominal values for the extra properties

smoothModel

Value: false

Type: Boolean

Description: True if the (derived) model should not generate state events

onePhase

Value: false

Type: Boolean

Description: True if the (derived) model should never be called with two-phase inputs

fluidConstants

Value:

Type: FluidConstants[nS]

Description: Constant data for the fluid

Wolfram Language

In[1]:=
SystemModel["Modelica.Media.Interfaces.PartialTwoPhaseMedium"]
Out[1]:=

Extended by (2)

WaterIF97_base

Modelica.Media.Water

Water: Steam properties as defined by IAPWS/IF97 standard

R134a_ph

Modelica.Media.R134a

Medium model for R134a and p,h as states