Skip to content
ParallelResonance.md

ParallelResonance

ParallelResonance models two parallel RLC resonance circuits, each driven by a current source with variable frequency and amplitude.

This component simulates two independent parallel RLC circuits. The first circuit is driven by a sinusoidal current source, and the second by a cosinusoidal current source. The frequency of both current sources is controlled by a common ramp signal, causing a frequency sweep. The amplitude of both current sources is determined by a common constant signal. Each RLC circuit consists of a resistor, an inductor, and a capacitor connected in parallel with the current source and a voltage sensor. The ground components provide a common reference potential.

Usage

ParallelResonance()

Behavior

julia
using ElectricalComponents #hide
using ModelingToolkit #hide
@named sys = ParallelResonance() #hide
full_equations(sys) #hide
<< @example-block not executed in draft mode >>

Source

dyad
# `ParallelResonance` models two parallel RLC resonance circuits, each driven by a current source with variable frequency and amplitude.
#
# This component simulates two independent parallel RLC circuits. The first circuit is driven by a sinusoidal current source,
# and the second by a cosinusoidal current source. The frequency of both current sources is controlled by a common ramp signal,
# causing a frequency sweep. The amplitude of both current sources is determined by a common constant signal.
# Each RLC circuit consists of a resistor, an inductor, and a capacitor connected in parallel with the current source
# and a voltage sensor. The ground components provide a common reference potential.
example component ParallelResonance
  # First RLC circuit's ideal current source for the first RLC circuit.
  current_source1 = CurrentSource() [{
    "Dyad": {
      "placement": {"icon": {"x1": 100, "y1": 100, "x2": 300, "y2": 300, "rot": 270}}
    }
  }]
  # First RLC circuit's ground reference for the first RLC circuit.
  ground1 = Ground() [{
    "Dyad": {"placement": {"icon": {"x1": 100, "y1": 400, "x2": 300, "y2": 600, "rot": 0}}}
  }]
  # First RLC circuit's resistor in the first parallel RLC circuit.
  resistor1 = Resistor(R=0.5) [{
    "Dyad": {"placement": {"icon": {"x1": 400, "y1": 100, "x2": 600, "y2": 300, "rot": 90}}}
  }]
  # First RLC circuit's inductor in the first parallel RLC circuit.
  inductor1 = Inductor(L=0.1/(2*pi)) [{
    "Dyad": {"placement": {"icon": {"x1": 700, "y1": 100, "x2": 900, "y2": 300, "rot": 90}}}
  }]
  # First RLC circuit's capacitor in the first parallel RLC circuit.
  capacitor1 = Capacitor(C=0.001/(2*pi)) [{
    "Dyad": {
      "placement": {"icon": {"x1": 1000, "y1": 100, "x2": 1200, "y2": 300, "rot": 90}}
    }
  }]
  # First RLC circuit's voltage sensor across the first RLC circuit.
  voltage_sensor1 = VoltageSensor() [{
    "Dyad": {
      "placement": {"icon": {"x1": 1300, "y1": 100, "x2": 1500, "y2": 300, "rot": 90}}
    }
  }]
  # Generates a sine wave with variable frequency and amplitude for the first current source.
  input_signal1 = BlockComponents.SineVariableFrequencyAndAmplitude() [{
    "Dyad": {"placement": {"icon": {"x1": -200, "y1": 100, "x2": 0, "y2": 300, "rot": 0}}}
  }]
  # Generates a cosine wave with variable frequency and amplitude for the second current source.
  input_signal2 = BlockComponents.CosineVariableFrequencyAndAmplitude() [{
    "Dyad": {"placement": {"icon": {"x1": -200, "y1": 700, "x2": 0, "y2": 900, "rot": 0}}}
  }]
  # Generates a ramp signal to control the frequency of the input signals.
  ramp = BlockComponents.Ramp(start_time=0, duration=1, offset=0, height=200) [{
    "Dyad": {
      "placement": {"icon": {"x1": -600, "y1": 250, "x2": -400, "y2": 450, "rot": 0}}
    }
  }]
  # Generates a constant signal to control the amplitude of the input signals.
  const_signal = BlockComponents.Constant(k=1) [{
    "Dyad": {
      "placement": {"icon": {"x1": -600, "y1": 550, "x2": -400, "y2": 750, "rot": 0}}
    }
  }]
  # Second RLC circuit's ideal current source for the second RLC circuit (cosine wave).
  current_source2 = CurrentSource() [{
    "Dyad": {
      "placement": {"icon": {"x1": 100, "y1": 700, "x2": 300, "y2": 900, "rot": 270}}
    }
  }]
  # Second RLC circuit's ground reference for the second RLC circuit.
  ground2 = Ground() [{
    "Dyad": {
      "placement": {"icon": {"x1": 100, "y1": 1000, "x2": 300, "y2": 1200, "rot": 0}}
    }
  }]
  # Second RLC circuit's resistor in the second parallel RLC circuit.
  resistor2 = Resistor(R=0.5) [{
    "Dyad": {"placement": {"icon": {"x1": 400, "y1": 700, "x2": 600, "y2": 900, "rot": 90}}}
  }]
  # Second RLC circuit's inductor in the second parallel RLC circuit.
  inductor2 = Inductor(L=0.1/(2*pi)) [{
    "Dyad": {"placement": {"icon": {"x1": 700, "y1": 700, "x2": 900, "y2": 900, "rot": 90}}}
  }]
  # Second RLC circuit's capacitor in the second parallel RLC circuit.
  capacitor2 = Capacitor(C=0.001/(2*pi)) [{
    "Dyad": {
      "placement": {"icon": {"x1": 1000, "y1": 700, "x2": 1200, "y2": 900, "rot": 90}}
    }
  }]
  # Second RLC circuit's voltage sensor across the second RLC circuit.
  voltage_sensor2 = VoltageSensor() [{
    "Dyad": {
      "placement": {"icon": {"x1": 1300, "y1": 700, "x2": 1500, "y2": 900, "rot": 90}}
    }
  }]
relations
  initial inductor1.i = 0
  initial inductor2.i = 0
  initial capacitor1.v = 0
  initial capacitor2.v = 0
  connect(ramp.y, input_signal1.frequency, input_signal2.frequency) [{
    "Dyad": {
      "edges": [
        {"S": -1, "E": 1},
        {"S": -1, "M": [{"x": -350, "y": 240}], "E": 2},
        {"S": -1, "M": [{"x": -350, "y": 840}], "E": 3}
      ],
      "junctions": [{"x": -350, "y": 350}]
    }
  }]
  connect(const_signal.y, input_signal1.amplitude, input_signal2.amplitude) [{
    "Dyad": {
      "edges": [
        {"S": -1, "E": 1},
        {"S": -1, "M": [{"x": -300, "y": 160}], "E": 2},
        {"S": -1, "M": [{"x": -300, "y": 760}], "E": 3}
      ],
      "junctions": [{"x": -300, "y": 650}]
    }
  }]
  connect(input_signal1.y, current_source1.I) [{"Dyad": {"edges": [{"S": 1, "E": 2}]}}]
  connect(input_signal2.y, current_source2.I) [{"Dyad": {"edges": [{"S": 1, "E": 2}]}}]
  connect(current_source1.n, resistor1.p, inductor1.p, capacitor1.p, voltage_sensor1.p) [{
    "Dyad": {
      "edges": [
        {"S": 1, "M": [{"x": 200, "y": 50}], "E": -1},
        {"S": -1, "E": 2},
        {"S": -1, "M": [{"x": 800, "y": 50}], "E": 3},
        {"S": -1, "M": [{"x": 1100, "y": 50}], "E": 4},
        {"S": -1, "M": [{"x": 1400, "y": 50}], "E": 5}
      ],
      "junctions": [{"x": 500, "y": 50}]
    }
  }]
  connect(ground1.g, current_source1.p, resistor1.n, inductor1.n, capacitor1.n, voltage_sensor1.n) [{
    "Dyad": {
      "edges": [
        {"S": 1, "E": -1},
        {"S": 2, "E": -1},
        {"S": -1, "M": [{"x": 500, "y": 350}], "E": 3},
        {"S": -1, "M": [{"x": 800, "y": 350}], "E": 4},
        {"S": -1, "M": [{"x": 1100, "y": 350}], "E": 5},
        {"S": -1, "M": [{"x": 1400, "y": 350}], "E": 6}
      ],
      "junctions": [{"x": 200, "y": 350}]
    }
  }]
  connect(current_source2.n, resistor2.p, inductor2.p, capacitor2.p, voltage_sensor2.p) [{
    "Dyad": {
      "edges": [
        {"S": -1, "M": [{"x": 200, "y": 650}], "E": 1},
        {"S": -1, "E": 2},
        {"S": -1, "M": [{"x": 800, "y": 650}], "E": 3},
        {"S": -1, "M": [{"x": 1100, "y": 650}], "E": 4},
        {"S": -1, "M": [{"x": 1400, "y": 650}], "E": 5}
      ],
      "junctions": [{"x": 500, "y": 650}]
    }
  }]
  connect(ground2.g, current_source2.p, resistor2.n, inductor2.n, capacitor2.n, voltage_sensor2.n) [{
    "Dyad": {
      "edges": [
        {"S": -1, "E": 1},
        {"S": -1, "E": 2},
        {"S": -1, "M": [{"x": 500, "y": 950}], "E": 3},
        {"S": -1, "M": [{"x": 800, "y": 950}], "E": 4},
        {"S": -1, "M": [{"x": 1100, "y": 950}], "E": 5},
        {"S": -1, "M": [{"x": 1400, "y": 950}], "E": 6}
      ],
      "junctions": [{"x": 200, "y": 950}]
    }
  }]
metadata {
  "Dyad": {
    "tests": {
      "case1": {"stop": 1, "expect": {"signals": ["voltage_sensor1.v", "voltage_sensor2.v"]}}
    }
  }
}
end
Flattened Source
dyad
# `ParallelResonance` models two parallel RLC resonance circuits, each driven by a current source with variable frequency and amplitude.
#
# This component simulates two independent parallel RLC circuits. The first circuit is driven by a sinusoidal current source,
# and the second by a cosinusoidal current source. The frequency of both current sources is controlled by a common ramp signal,
# causing a frequency sweep. The amplitude of both current sources is determined by a common constant signal.
# Each RLC circuit consists of a resistor, an inductor, and a capacitor connected in parallel with the current source
# and a voltage sensor. The ground components provide a common reference potential.
example component ParallelResonance
  # First RLC circuit's ideal current source for the first RLC circuit.
  current_source1 = CurrentSource() [{
    "Dyad": {
      "placement": {"icon": {"x1": 100, "y1": 100, "x2": 300, "y2": 300, "rot": 270}}
    }
  }]
  # First RLC circuit's ground reference for the first RLC circuit.
  ground1 = Ground() [{
    "Dyad": {"placement": {"icon": {"x1": 100, "y1": 400, "x2": 300, "y2": 600, "rot": 0}}}
  }]
  # First RLC circuit's resistor in the first parallel RLC circuit.
  resistor1 = Resistor(R=0.5) [{
    "Dyad": {"placement": {"icon": {"x1": 400, "y1": 100, "x2": 600, "y2": 300, "rot": 90}}}
  }]
  # First RLC circuit's inductor in the first parallel RLC circuit.
  inductor1 = Inductor(L=0.1/(2*pi)) [{
    "Dyad": {"placement": {"icon": {"x1": 700, "y1": 100, "x2": 900, "y2": 300, "rot": 90}}}
  }]
  # First RLC circuit's capacitor in the first parallel RLC circuit.
  capacitor1 = Capacitor(C=0.001/(2*pi)) [{
    "Dyad": {
      "placement": {"icon": {"x1": 1000, "y1": 100, "x2": 1200, "y2": 300, "rot": 90}}
    }
  }]
  # First RLC circuit's voltage sensor across the first RLC circuit.
  voltage_sensor1 = VoltageSensor() [{
    "Dyad": {
      "placement": {"icon": {"x1": 1300, "y1": 100, "x2": 1500, "y2": 300, "rot": 90}}
    }
  }]
  # Generates a sine wave with variable frequency and amplitude for the first current source.
  input_signal1 = BlockComponents.SineVariableFrequencyAndAmplitude() [{
    "Dyad": {"placement": {"icon": {"x1": -200, "y1": 100, "x2": 0, "y2": 300, "rot": 0}}}
  }]
  # Generates a cosine wave with variable frequency and amplitude for the second current source.
  input_signal2 = BlockComponents.CosineVariableFrequencyAndAmplitude() [{
    "Dyad": {"placement": {"icon": {"x1": -200, "y1": 700, "x2": 0, "y2": 900, "rot": 0}}}
  }]
  # Generates a ramp signal to control the frequency of the input signals.
  ramp = BlockComponents.Ramp(start_time=0, duration=1, offset=0, height=200) [{
    "Dyad": {
      "placement": {"icon": {"x1": -600, "y1": 250, "x2": -400, "y2": 450, "rot": 0}}
    }
  }]
  # Generates a constant signal to control the amplitude of the input signals.
  const_signal = BlockComponents.Constant(k=1) [{
    "Dyad": {
      "placement": {"icon": {"x1": -600, "y1": 550, "x2": -400, "y2": 750, "rot": 0}}
    }
  }]
  # Second RLC circuit's ideal current source for the second RLC circuit (cosine wave).
  current_source2 = CurrentSource() [{
    "Dyad": {
      "placement": {"icon": {"x1": 100, "y1": 700, "x2": 300, "y2": 900, "rot": 270}}
    }
  }]
  # Second RLC circuit's ground reference for the second RLC circuit.
  ground2 = Ground() [{
    "Dyad": {
      "placement": {"icon": {"x1": 100, "y1": 1000, "x2": 300, "y2": 1200, "rot": 0}}
    }
  }]
  # Second RLC circuit's resistor in the second parallel RLC circuit.
  resistor2 = Resistor(R=0.5) [{
    "Dyad": {"placement": {"icon": {"x1": 400, "y1": 700, "x2": 600, "y2": 900, "rot": 90}}}
  }]
  # Second RLC circuit's inductor in the second parallel RLC circuit.
  inductor2 = Inductor(L=0.1/(2*pi)) [{
    "Dyad": {"placement": {"icon": {"x1": 700, "y1": 700, "x2": 900, "y2": 900, "rot": 90}}}
  }]
  # Second RLC circuit's capacitor in the second parallel RLC circuit.
  capacitor2 = Capacitor(C=0.001/(2*pi)) [{
    "Dyad": {
      "placement": {"icon": {"x1": 1000, "y1": 700, "x2": 1200, "y2": 900, "rot": 90}}
    }
  }]
  # Second RLC circuit's voltage sensor across the second RLC circuit.
  voltage_sensor2 = VoltageSensor() [{
    "Dyad": {
      "placement": {"icon": {"x1": 1300, "y1": 700, "x2": 1500, "y2": 900, "rot": 90}}
    }
  }]
relations
  initial inductor1.i = 0
  initial inductor2.i = 0
  initial capacitor1.v = 0
  initial capacitor2.v = 0
  connect(ramp.y, input_signal1.frequency, input_signal2.frequency) [{
    "Dyad": {
      "edges": [
        {"S": -1, "E": 1},
        {"S": -1, "M": [{"x": -350, "y": 240}], "E": 2},
        {"S": -1, "M": [{"x": -350, "y": 840}], "E": 3}
      ],
      "junctions": [{"x": -350, "y": 350}]
    }
  }]
  connect(const_signal.y, input_signal1.amplitude, input_signal2.amplitude) [{
    "Dyad": {
      "edges": [
        {"S": -1, "E": 1},
        {"S": -1, "M": [{"x": -300, "y": 160}], "E": 2},
        {"S": -1, "M": [{"x": -300, "y": 760}], "E": 3}
      ],
      "junctions": [{"x": -300, "y": 650}]
    }
  }]
  connect(input_signal1.y, current_source1.I) [{"Dyad": {"edges": [{"S": 1, "E": 2}]}}]
  connect(input_signal2.y, current_source2.I) [{"Dyad": {"edges": [{"S": 1, "E": 2}]}}]
  connect(current_source1.n, resistor1.p, inductor1.p, capacitor1.p, voltage_sensor1.p) [{
    "Dyad": {
      "edges": [
        {"S": 1, "M": [{"x": 200, "y": 50}], "E": -1},
        {"S": -1, "E": 2},
        {"S": -1, "M": [{"x": 800, "y": 50}], "E": 3},
        {"S": -1, "M": [{"x": 1100, "y": 50}], "E": 4},
        {"S": -1, "M": [{"x": 1400, "y": 50}], "E": 5}
      ],
      "junctions": [{"x": 500, "y": 50}]
    }
  }]
  connect(ground1.g, current_source1.p, resistor1.n, inductor1.n, capacitor1.n, voltage_sensor1.n) [{
    "Dyad": {
      "edges": [
        {"S": 1, "E": -1},
        {"S": 2, "E": -1},
        {"S": -1, "M": [{"x": 500, "y": 350}], "E": 3},
        {"S": -1, "M": [{"x": 800, "y": 350}], "E": 4},
        {"S": -1, "M": [{"x": 1100, "y": 350}], "E": 5},
        {"S": -1, "M": [{"x": 1400, "y": 350}], "E": 6}
      ],
      "junctions": [{"x": 200, "y": 350}]
    }
  }]
  connect(current_source2.n, resistor2.p, inductor2.p, capacitor2.p, voltage_sensor2.p) [{
    "Dyad": {
      "edges": [
        {"S": -1, "M": [{"x": 200, "y": 650}], "E": 1},
        {"S": -1, "E": 2},
        {"S": -1, "M": [{"x": 800, "y": 650}], "E": 3},
        {"S": -1, "M": [{"x": 1100, "y": 650}], "E": 4},
        {"S": -1, "M": [{"x": 1400, "y": 650}], "E": 5}
      ],
      "junctions": [{"x": 500, "y": 650}]
    }
  }]
  connect(ground2.g, current_source2.p, resistor2.n, inductor2.n, capacitor2.n, voltage_sensor2.n) [{
    "Dyad": {
      "edges": [
        {"S": -1, "E": 1},
        {"S": -1, "E": 2},
        {"S": -1, "M": [{"x": 500, "y": 950}], "E": 3},
        {"S": -1, "M": [{"x": 800, "y": 950}], "E": 4},
        {"S": -1, "M": [{"x": 1100, "y": 950}], "E": 5},
        {"S": -1, "M": [{"x": 1400, "y": 950}], "E": 6}
      ],
      "junctions": [{"x": 200, "y": 950}]
    }
  }]
metadata {
  "Dyad": {
    "tests": {
      "case1": {"stop": 1, "expect": {"signals": ["voltage_sensor1.v", "voltage_sensor2.v"]}}
    }
  }
}
end


Test Cases

julia
using ElectricalComponents
using ModelingToolkit, OrdinaryDiffEqDefault
using Plots
using CSV, DataFrames

snapshotsdir = joinpath(dirname(dirname(pathof(ElectricalComponents))), "test", "snapshots")
<< @setup-block not executed in draft mode >>

Test Case case1

julia
@mtkbuild model_case1 = ParallelResonance()
u0_case1 = []
prob_case1 = ODEProblem(model_case1, u0_case1, (0, 1))
sol_case1 = solve(prob_case1)
<< @setup-block not executed in draft mode >>
julia
df_case1 = DataFrame(:t => sol_case1[:t], :actual => sol_case1[model_case1.voltage_sensor1.v])
dfr_case1 = try CSV.read(joinpath(snapshotsdir, "ParallelResonance_case1_sig0.ref"), DataFrame); catch e; nothing; end
plt = plot(sol_case1, idxs=[model_case1.voltage_sensor1.v], width=2, label="Actual value of voltage_sensor1.v")
if !isnothing(dfr_case1)
  scatter!(plt, dfr_case1.t, dfr_case1.expected, mc=:red, ms=3, label="Expected value of voltage_sensor1.v")
end
<< @setup-block not executed in draft mode >>
julia
plt
<< @example-block not executed in draft mode >>
julia
df_case1 = DataFrame(:t => sol_case1[:t], :actual => sol_case1[model_case1.voltage_sensor2.v])
dfr_case1 = try CSV.read(joinpath(snapshotsdir, "ParallelResonance_case1_sig1.ref"), DataFrame); catch e; nothing; end
plt = plot(sol_case1, idxs=[model_case1.voltage_sensor2.v], width=2, label="Actual value of voltage_sensor2.v")
if !isnothing(dfr_case1)
  scatter!(plt, dfr_case1.t, dfr_case1.expected, mc=:red, ms=3, label="Expected value of voltage_sensor2.v")
end
<< @setup-block not executed in draft mode >>
julia
plt
<< @example-block not executed in draft mode >>
  • Examples

  • Experiments

  • Analyses