MathGroup Archive 1998

[Date Index] [Thread Index] [Author Index]

Search the Archive

Re: I Want More Digits in TraditionalForm

  • To: mathgroup at smc.vnet.net
  • Subject: [mg14397] Re: I Want More Digits in TraditionalForm
  • From: soiffer (Neil Soiffer)
  • Date: Sun, 18 Oct 1998 15:10:03 -0400
  • Organization: Wolfram Research, Inc.
  • References: <199808110856.EAA10627@smc.vnet.net.> <361E5F95.4B1@nowhere.net> <6vupoq$8hu@smc.vnet.net>
  • Sender: owner-wri-mathgroup at wolfram.com

In article <6vupoq$8hu at smc.vnet.net> MJE <nospam at gte.net> writes:
>Question.  How does one get TraditionalForm to print out all numerical
>values with many digits, instead of just 5 or 6?
>
>Here are some input cells you can try out to get the feeling of what I'm
>doing.
>
>The reason to retain many digits is the interrelation between functions,
>i.e. c[p] and p[c] are functional inverses, etc.  Chopping digits
>arbitrarily destroys these relations.
>
>Thanks group,
>
>Mark Evans
>"evans" at "gte" dot "net"
>
>____________________________
>
>c[p_] := 0.07549146238926269*ArcSinh[0.00007718657554083618*p] p[c_] :=
>12955.620753908715*Sinh[13.246531042724007*c] betaOfP[p_] := 
>  171617.0324944112*Sqrt[1 + HoldForm[(0.00007718657554083618*p)]^2]
>betaOfC[c_]  :=  171617.0324944112*Cosh[13.246531042724007*c]
>
>
>(* Display functions in TraditionalForm *)
>TraditionalForm[HoldForm[p[c]] == p[c]] TraditionalForm[HoldForm[c[p]]
>== c[p]] TraditionalForm[HoldForm[\[Beta][p]] == betaOfP[p]]


In V3.0.1, I don't see the problem you are having. Eg, one of the
TraditionalForm cells looks like: \!\(\*FormBox[
  RowBox[{
    TagBox[\(c(p)\),
      HoldForm], "==", 
    RowBox[{
      StyleBox["0.0754914623892626845`",
        StyleBoxAutoDelete->True,
        PrintPrecision->16], " ", 
      RowBox[{\(sinh\^\(-1\)\), "(", 
        RowBox[{
          StyleBox["0.0000771865755408361753`",
            StyleBoxAutoDelete->True,
            PrintPrecision->16], " ", "p"}], ")"}]}]}],
TraditionalForm]\)


Perhaps 3.0.0 did not set PrintPrecision?  If this is the case, this is
a general frontend option whose default value is 6.  You can set this
to a higher value at the global, notebook, cell, or selection level.

I hope this helps,

	Neil Soiffer


  • Prev by Date: Re: Adding equations
  • Next by Date: Re: 2 ticks on a 2D plot
  • Previous by thread: I Want More Digits in TraditionalForm
  • Next by thread: SUMMARY: How {{a,b,c},{1,2,3,4,5,6,7}}-->{{a,1},{b,2},{c,3},{a,4},...,{a,7},{b,1},...}?