Message Boards Message Boards

1
|
1050 Views
|
15 Replies
|
3 Total Likes
View groups...
Share
Share this post:

Convert differential equation with substitutions?

Posted 5 months ago

Hi
How do we get from equation 11 to equation 13 with mathematica by converting equations 12?

enter image description here

POSTED BY: Sami Heidari
15 Replies
Posted 5 months ago

@gianlucagorni

I’m so grateful. It has only one extra C^2.

POSTED BY: Sami Heidari

Sorry, I had started with the wrong derivative:

eq0 = D[u[x, t], {x, 2}] - (v - 2)*
    u[x, t] - (v + v1/\[Mu])*(-u[x, t]^3 + u[x, t]^5);
eq0 /. u -> Function[{x, t}, U[Sqrt[k] (x - c t)]]
% /. Sqrt[k] (x - c t) -> \[Xi]
% /. {U -> Function[\[Xi], Sqrt[W[\[Xi]]]]} // Simplify
eq = Collect[%*4 \[Mu] W[\[Xi]]^(3/2)/(4 \[Mu] W[\[Xi]]),
  {W[\[Xi]], W'[\[Xi]], W''[\[Xi]]}, Factor]
POSTED BY: Gianluca Gorni
Posted 5 months ago

Much obliged.

POSTED BY: Sami Heidari
Posted 5 months ago

Hello Where did I go wrong for this conversion? enter image description here

POSTED BY: Sami Heidari

Here is my interpretation:

eq0 = I*D[
    Subscript[\[Phi], 
     n][\[Tau]], \[Tau]] + (1 + \[Mu]*
      Abs[Subscript[\[Phi], n][\[Tau]]]^2)*
   (Subscript[\[Phi], n + 1][\[Tau]]*Exp[I*k] + 
     Subscript[\[Phi], n - 1][\[Tau]]*Exp[-I*k]) -
  \[Nu]*(Abs[Subscript[\[Phi], n][\[Tau]]]^2)*
   Subscript[\[Phi], n][\[Tau]]
% /. Subscript[\[Phi], n_] -> 
  Function[\[Tau], Subscript[\[Chi], n] Exp[-I*\[Theta]*\[Tau]]]
FullSimplify[% /. Subscript[\[Chi], n_] :> Subscript[u, n]/Sqrt[\[Mu]],
 Element[\[Theta] | \[Tau] | Subscript[u, n_], Reals] && \[Mu] > 0]
Collect[%*\[Mu]^(
   1/2)/(E^(-I (k + \[Theta] \[Tau])) (1 + (Subscript[u, n])^2)),
 {Subscript[u, n - 1], Subscript[u, n + 1]}]

I don't know how to get rid of the exponentials.

POSTED BY: Gianluca Gorni
Posted 5 months ago

Thank you. What is this part for?

enter image description here

POSTED BY: Sami Heidari

This eliminates some common factors and brings the expression into a form more similar to equation (3).

POSTED BY: Gianluca Gorni
Posted 5 months ago

Thanks for your hard work on this But the answers are different.

POSTED BY: Sami Heidari

Your equation (1) depends on k, while equation (3) does not. How is it possible? Are you tacitly assuming that k is an even integer?

POSTED BY: Gianluca Gorni
Posted 5 months ago

Hi, It is like this and we get from equation 6 to equation 10.

enter image description here

POSTED BY: Sami Heidari
Posted 4 months ago

It was resolved ,Thank you. I couldn't have done it without you.

POSTED BY: Sami Heidari

This should work in version 12:

eq0 = D[u[x, t], {t, 2}] - (v - 2)*
    u[x, t] - (v + v1/\[Mu])*(-u[x, t]^3 + u[x, t]^5);
eq0 /. u -> Function[{x, t}, U[Sqrt[k] (x - c t)]]
% /. Sqrt[k] (x - c t) -> \[Xi]
% /. {U -> Function[\[Xi], Sqrt[W[\[Xi]]]]} // Simplify
Collect[%*4 \[Mu] W[\[Xi]]^(3/2)/(4 c^2 \[Mu] W[\[Xi]]),
 {W'[\[Xi]], W''[\[Xi]]}]
POSTED BY: Gianluca Gorni
Posted 5 months ago

Thank you My version of Mathematica is different and does not give that answer

POSTED BY: Sami Heidari

It dosen't work because, DSolveChangeVariables command was introduced in 2022 in version 13.1. You need update to newer version of Mathematica.

Reagards M.I.

POSTED BY: Mariusz Iwaniuk

I have only:

POSTED BY: Mariusz Iwaniuk
Reply to this discussion
Community posts can be styled and formatted using the Markdown syntax.
Reply Preview
Attachments
Remove
or Discard

Group Abstract Group Abstract