 
 
 
 
 
 
RE: pbms with Mathematica 4.1 under Windows (copy paste ? comments?)
- To: mathgroup at smc.vnet.net
- Subject: [mg27669] RE: [mg27590] pbms with Mathematica 4.1 under Windows (copy paste ? comments?)
- From: "Wolf, Hartmut" <Hartmut.Wolf at t-systems.de>
- Date: Sat, 10 Mar 2001 00:50:03 -0500 (EST)
- Sender: owner-wri-mathgroup at wolfram.com
Luc,
in some odd way (it's only you who can reproduce this) you managed to
include a spurious RowBox into your cell expession. Having removed that (it
was around the curly braces and the comma that follows) I get
In[15]:=
Cell[BoxData[
    RowBox[{
      RowBox[{"FindMMaBug", "[", "Test_", "]"}], ":=", 
      RowBox[{"Module", "[", "\[IndentingNewLine]", 
        RowBox[{
          RowBox[{"{", "}"}], ",", "\[IndentingNewLine]", 
          "\[IndentingNewLine]", 
          RowBox[{"(*", " ", 
            RowBox[{
            "this", " ", "really", " ", "does", " ", "not", " ", "try", 
              " ", "to", " ", "do", " ", "anything", " ", "except", " ",
               "find", " ", "a", " ", "bug", " ", "in", " ", "Mma"}], 
            " ", "*)"}], "\[IndentingNewLine]", "\[IndentingNewLine]", 
          RowBox[{
            RowBox[{"Test", "=", "300"}], ";"}]}], 
        "\[IndentingNewLine]", "\[IndentingNewLine]", 
        "\[IndentingNewLine]", "]"}]}]], "Input",
  CellLabel->"In[15]:="]
which now seems to be fine and corresponds to the expression I get when I
try to edit your Mathematica expression directly with my frontend. And I
don't get the error
>From In[4]:=
Syntax::sntxb: Expression cannot begin with "{}, Test=300;".
>From In[4]:=
FindMMaBug[Test_]:=Module[{},
      Test=300;]
any longer when executing the cell expression. Maybe you tried (this is pure
speculation indeed!) to polish up your expression through backspacing, or
did so inadvertantly and unnoticed, but did not remove all remnants.
(Perhaps it's save to backspace until you remove the first *visible*
character of that part you wish to retain, enter that again and proceed.)
My version is
In[17]:= $Version
Out[17]= 4.1 for Microsoft Windows (November 2, 2000)
I hope to have helped somewhat.
-- Hartmut
> -----Original Message-----
> From:	Barthelet, Luc [SMTP:lucb at ea.com]
To: mathgroup at smc.vnet.net
> Sent:	Thursday, March 08, 2001 5:05 AM
> To:	mathgroup at smc.vnet.net
> Subject:	[mg27590] pbms with Mathematica 4.1 under Windows (copy
> paste? comments?)
> 
> 
> 
> > here is a cell from a notebook that shows a really annoying problem.
> > everytime I work on a new cell with a few lines I quickly get into a
> > syntax error while running it, this seems to be triggered by the use of
> > "copy-paste" near comments.
> This cell was created just by typing it the way it looks, and then copying
> the "test=300;" and pasting it under, then removing the original one.
> 
> > There is no syntax error in the cell, but Mathematica is confused when
> you try to
> > run the cell.
> > Selecting Display->Text and then Display->Standard Form fixes the
> problem,
> > but looses the cell layout.
> > This is driving me nuts.
> > 
> > I suspect this is not a "real" problem with Mathematica 4.1, because you
> would
> > have found it in beta test.
> > Maybe it is my configuration?
> > How can I fix this?
> I already emailed support@wolfram, but they are a bit slow to answer....
> 
> > I am running under Windows 2000, I tested the same problem under
> > Windows98.  Mathematica is version 4.1.0.0.
> > 
> > thanks,
> > 
> Luc Barthelet
> 
> -------------------------------------
> 
> Cell[BoxData[
>     RowBox[{
>       RowBox[{"FindMMaBug", "[", "Test_", "]"}], ":=", 
>       RowBox[{"Module", "[", "\[IndentingNewLine]", 
>         RowBox[{
>           RowBox[{
>             RowBox[{"{", "}"}], ","}], "\[IndentingNewLine]", 
>           "\[IndentingNewLine]", 
>           RowBox[{"(*", " ", 
>             RowBox[{
>             "this", " ", "really", " ", "does", " ", "not", " ", 
>               "try", " ", "to", " ", "do", " ", "anything", " ", 
>               "except", " ", "find", " ", "a", " ", "bug", " ", "in", 
>               " ", "Mma"}], " ", "*)"}], "\[IndentingNewLine]", 
>           "\[IndentingNewLine]", 
>           RowBox[{
>             RowBox[{"Test", "=", "300"}], ";"}]}], 
>         "\[IndentingNewLine]", "\[IndentingNewLine]", 
>         "\[IndentingNewLine]", "]"}]}]], "Input"]
> 
> 

