Group Abstract Group Abstract

Message Boards Message Boards

Encoded Package works in .nb but not in Enterprise CDF?

Posted 10 years ago
Attachments:
POSTED BY: Erdem Uguz
4 Replies
Posted 10 years ago

I am trying to adapt you solution to my program but it is not working. I would like to understand the difference because I am working on this example for learning on purpose. I would like to understand why this is not working.

Manipulate[
 DynamicModule[{f = Sin[x], xR = 1, xL = 0, 
   Res = 0.4596976941318603`16}, 
  Column[{Style["1D Definite Integral Calculator", "Function"] , 
    Row[{"Lower Limit ", InputField[Dynamic[xL], Number]}, Spacer[5]],
     Row[{"Upper Limit ", InputField[Dynamic[xR], Number]}, 
     Spacer[5]], 
    Row[{"Function  ", InputField[Dynamic[f]]}, Spacer[20]], 
    Button[Style["Calculate", Green, Bold], 
     Dynamic[Res = TFPackage`WD1Int[f, xR, xL, np, nw];]], 
    Row[{"Result", InputField[Dynamic[Res], Enabled -> False]}, 
     Spacer[51]], 
    Row[{"Plot the Function ", 
      Checkbox[Dynamic[fp], {False, True}]}],
    If[fp == True, 
     InputField[
      Dynamic[Plot[f, {x, xL, xR}, Dynamic[PlotLabel -> f], 
        ImageSize -> Full]], FieldSize -> {30, 15}]], 
    Button[Mouseover[Style["http://www.wolfram.com", "Hyperlink"], 
      Style["http://www.wolfram.com", "HyperlinkActive"]], 
     NotebookLocate[{URL["http://www.wolfram.com"], None}], 
     Appearance -> None]}]], {{np, 16, "NumberFormat"}, 
  ControlPlacement -> Bottom}, {{nw, 16, "WorkingPrecision"}, 
  ControlPlacement -> Bottom}, 
 Initialization :> (Get[
     FileNameJoin[{NotebookDirectory[EvaluationNotebook[]], 
       "TFPackage.m"}]];)]

And the package is

BeginPackage["TFPackage`"];
WD1Int::usage="";
Begin["`Private`"];
WD1Int[f_,xR_,xL_,np_,nw_]:=Module[{xLcheck,xRcheck},xLcheck=NumberQ[xL];
xRcheck=NumberQ[xR];
If[xLcheck==True&&xRcheck==True,WResultTF=SetPrecision[NIntegrate[f,{x,xL,xR},WorkingPrecision->Re[IntegerPart[nw]]],Re[IntegerPart[np]]],"Enter numeric inputs for Lower and Upper Limits"]];
SetAttributes[WD1Int,{ReadProtected,Protected,Locked}];
End[];
EndPackage[];

It is almost exactly same I can't understand what is the problem.

Thank you for the help

enter image description here

POSTED BY: Erdem Uguz

Sorry, this should work better.

Manipulate[
 Column[{Style["1D Definite Integral Calculator", "Subsubitem"], 
   Row[{"Lower Limit ", InputField[Dynamic[xL], Number]}, Spacer[5]], 
   Row[{"Upper Limit ", InputField[Dynamic[xR], Number]}, Spacer[5]],
   Row[{"Function  ", InputField[Dynamic[f]]}, Spacer[20]],

   Button[Style["Calculate", Green, Bold], 
    Res = TF1DINTPackage`D1Int[f, x, xR, xL, np, nw];],

   Row[{"Result", InputField[Dynamic[Res], Enabled -> False]}, 
    Spacer[51]], 
   Row[{"Plot the Function ", Checkbox[Dynamic[fp], {False, True}]}], 
   Dynamic@If[fp, 
     Plot[f[x], {x, xL, xR}, PlotLabel -> f, ImageSize -> 200], ""],

   Button[
    Mouseover[Style["http://www.wolfram.com", "Hyperlink"], 
     Style["http://www.wolfram.com", "HyperlinkActive"]], 
    NotebookLocate[{URL["http://www.wolfram.com"], None}], 
    Appearance -> None]


   }], {{np, 16, "NumberFormat"}, ControlPlacement -> Bottom},
 {{nw, 16, "WorkingPrecision"}, ControlPlacement -> Bottom},

 Initialization :> (f = Sin[#] + Cos[#] &; xR = 1; xL = 0; 
   Get[FileNameJoin[{NotebookDirectory[EvaluationNotebook[]], 
      "TF1DINTPackage.m"}]];
   Res = TF1DINTPackage`D1Int[f, x, xR, xL, 16, 16];)]
POSTED BY: Rolf Mertig
Posted 10 years ago
POSTED BY: Erdem Uguz
POSTED BY: Rolf Mertig
Reply to this discussion
Community posts can be styled and formatted using the Markdown syntax.
Reply Preview
Attachments
Remove
or Discard