WOLFRAM SYSTEM MODELER

RollsRoyceAE2100

Turboprop engine: Rolls-Royce AE 2100

Diagram

Wolfram Language

In[1]:=
SystemModel["Aircraft.Physical.FixedWing.Parts.Propulsions.Engines.TurbopropEngines.RollsRoyceAE2100"]
Out[1]:=

Information

This model extends the TurbopropEngine model and contains the parameters of the Rolls-Royce AE 2100 engine.

References for Engine Parameter Values

[1]  Wikipedia. (2022). "Rolls-Royce AE 2100". [online] 
      Available at: https://en.wikipedia.org/wiki/Rolls-Royce_AE_2100#Specifications_(AE_2100D3) [Accessed 26 Oct. 2022].

Parameters (25)

weightEst

Value:

Type: Boolean

Description: true, if weight estimation method is used for masses, center of mass location and inertia tensor

bWing

Value:

Type: Length (m)

Description: Main wing span

SrefWing

Value:

Type: Area (m²)

Description: Main wing reference area

CADshapes

Value:

Type: Boolean

Description: true, if external CAD files are used for animation

negThrust

Value: 0

Type: Real

Description: Maximum negative thrust (0 to 1 of thrust available)

rho0

Value:

Type: Density (kg/m³)

Description: Air density at sea-level

Psealevel

Value: 3096000

Type: Power (W)

Description: Engine power at sea level

BSFC

Value: 7.77777777777778e-08

Type: BrakeSpecificFuelConsumption (kg⋅W⁻¹⋅s⁻¹)

Description: Brake-specific fuel consumption in cruise

dProp

Value: 3.81

Type: Length (m)

Description: Propeller diameter

etaProp

Value: 0.8

Type: Real

Description: Propeller efficiency

etaEng

Value: 0.8

Type: Real

Description: Power transmission efficiency

kSkinNac

Value:

Type: Length (m)

Description: Nacelle surface roughness height

mNac

Value: 0.345 * 0.47 * mEngDry

Type: Mass (kg)

Description: Nacelle mass

mProp

Value: 6.13 * (Tstatic * N2kg) / 1000

Type: Mass (kg)

Description: Propeller mass

mEngDry

Value: 0.0117 * 1.2 * Tstatic ^ 1.0572

Type: Mass (kg)

Description: Engine dry mass

mEngInstalled

Value: mEngDry + mNac + mProp

Type: Mass (kg)

Description: Installed engine mass

xEngCM

Value: lNac / 2

Type: Length (m)

Description: Engine center of mass x-coordinate w.r.t. engine rear end

IxxEng

Value: mEngInstalled * (dNac / 2) ^ 2 / 2

Type: MomentOfInertia (kg⋅m²)

Description: Engine roll moment of inertia

IyyEng

Value: mEngInstalled * (dNac / 2) ^ 2 / 4 + mEngInstalled * lNac ^ 2 / 12

Type: MomentOfInertia (kg⋅m²)

Description: Engine pitch moment of inertia

IzzEng

Value: mEngInstalled * (dNac / 2) ^ 2 / 4 + mEngInstalled * lNac ^ 2 / 12

Type: MomentOfInertia (kg⋅m²)

Description: Engine yaw moment of inertia

dNac

Value: 4 * (0.0625 + 1 / (4 * sqrt(2)) * max(1.730 * log(max(Tstatic / 1000, 1)) - Modelica.Constants.pi, 0) ^ 0.5)

Type: Length (m)

Description: Nacelle diameter

lNac

Value: 5 * (Tstatic / 1000) ^ 0.9839 / (6 * Modelica.Constants.pi * (1.730 * log(max(Tstatic / 1000, 1)) - Modelica.Constants.pi))

Type: Length (m)

Description: Nacelle length

SwetNac

Value: 2 * Modelica.Constants.pi ^ 2 * 0.2028 * dNac * ((0.20571 * lNac ^ 2 + 0.04661 * dNac ^ 2) ^ 0.5 + (0.1853 * lNac ^ 2 + 0.07557 * dNac ^ 2) ^ 0.5 - (0.005077 * lNac ^ 2 + 0.01611 * dNac ^ 2) ^ 0.5 - (0.01651 * lNac ^ 2 + 0.03666 * dNac ^ 2) ^ 0.5)

Type: Area (m²)

Description: Nacelle wetted area

FFnac

Value: 1.17 * (1 + 0.35 * (dNac / max(lNac, 0.01)))

Type: Real

Description: Nacelle form factor

Tstatic

Value: (Modelica.Constants.pi / 2 * rho0 * dProp ^ 2 * Psealevel ^ 2) ^ (1 / 3)

Type: Force (N)

Description: Static thrust of one engine at sea level

Inputs (1)

flightData

Type: FlightData

Description: Global flight data variables

Connectors (3)

deltaThrotCmd

Type: RealInput

Description: Throttle position command

engineRP

Type: Frame_b

Description: Connector to engine reference point

yConsumption

Type: RealOutput

Description: Consumed electric energy or fuel in an engine

Components (15)

flightData

Type: FlightData

Description: Global flight data variables

energySystem

Type: FuelSystemBrakeSpecific

Description: Model to calculate the consumed electric energy or fuel in an engine

thrustEngine

Type: WorldForce

Description: Engine net thrust

engShape

Type: FixedShape

Description: Engine visualization

thrustAvailable

Type: RealExpression

Description: Thrust available of one engine

engineThrustDmd

Type: Product

Description: Thrust demand for one engine

engineDynamics

Type: CriticalDamping

Description: Simplified model of the engine dynamics

throttleOnGround

Type: Limiter

Description: Limits the throttle from maximum negative thrust to 1 once on the ground

dragNacelle3D

Type: RealExpression[3]

Description: Drag due to one nacelle

dragNacelle

Type: WorldForce

Description: Drag of nacelle

translEng

Type: FixedTranslation

Description: Translation from engine rear end to the point where thrust and drag are acting on (currently no translation)

bodyEng

Type: Body

Description: Mass and inertia of engine

switch

Type: Switch

Description: Switch between two Real signals

throttleInAir

Type: Limiter

Description: Limits the throttle from 0 to 1 once airborne

onGround

Type: BooleanExpression

Description: Boolean expression for indicating aircraft being on ground