Snippets Collections
//Optimal page replacement
#include<stdio.h>
int n;
int main()
{
int seq[30],fr[5],pos[5],find,flag,max,i,j,m,k,t,s;
int count=1,pf=0,p=0;
float pfr;
printf("Enter maximum limit of the sequence: ");
scanf("%d",&max);
printf("\nEnter the sequence: ");
 for(i=0;i<max;i++)
scanf("%d",&seq[i]);
 printf("\nEnter no. of frames: ");
 scanf("%d",&n);
fr[0]=seq[0];
pf++;
printf("%d\t",fr[0]);
i=1;
while(count<n)
{
flag=1; p++;
for(j=0;j<i;j++)
{
if(seq[i]==seq[j]) flag=0;
}
if(flag!=0)
{
 fr[count]=seq[i];
 printf("%d\t",fr[count]);
 count++;
pf++;

}
i++;
}
 
printf("\n");
for(i=p;i<max;i++)
{
flag=1;
for(j=0;j<n;j++)
{
if(seq[i]==fr[j])
flag=0;
}
if(flag!=0)

{
for(j=0;j<n;j++)
{
m=fr[j];
for(k=i;k<max;k++)
{
if(seq[k]==m)
{
    pos[j]=k;
     break;

 }
else
pos[j]=1;

}
}
for(k=0;k<n;k++)
{
if(pos[k]==1)
flag=0;
}
if(flag!=0)
s=findmax(pos);
 if(flag==0)
{
for(k=0;k<n;k++)
{
if(pos[k]==1)
{
s=k;
 break;
}
}
}
fr[s]=seq[i];
for(k=0;k<n;k++)
printf("%d\t",fr[k]);
pf++;
printf("\n");
}
}
pfr=(float)pf/(float)max;
printf("\nThe no. of page faults are %d",pf);
printf("\nPage fault rate %f",pfr);
getch();
}
int findmax(int a[])
{
int max,i,k=0;
max=a[0];
for(i=0;i<n;i++)
{
if(max<a[i])
{
  max=a[i];
   k=i;
}
}
return k;
}
//FIFO PAGE REPLACEMENT ALGORITHM
#include<stdio.h>
#include<conio.h>
int main()
{
int i, j, k, f, pf=0, count=0, rs[25], m[10], n;
printf("\n Enter the length of reference string -- ");
scanf("%d",&n);
printf("\n Enter the reference string -- ");
 for(i=0;i<n;i++)
scanf("%d",&rs[i]);
 printf("\n Enter no. of frames -- ");
 scanf("%d",&f);
for(i=0;i<f;i++)
m[i]=-1;

printf("\n The Page Replacement Process is -- \n");
 for(i=0;i<n;i++)
{
for(k=0;k<f;k++)
{
  if(m[k]==rs[i])
  break;

}
if(k==f)
{
m[count++]=rs[i];
pf++;

}

for(j=0;j<f;j++)
printf("\t%d",m[j]);
if(k==f)
printf("\tPF No. %d",pf);
printf("\n");
if(count==f)
count=0;
}
printf("\n The number of Page Faults using FIFO are %d",pf);
getch();

}
Sub LoopEachOpenWorkbook()

'PURPOSE: Add today's date into every currently open Excel workbook
'SOURCE: www.TheSpreadsheetGuru.com

Dim wb As Workbook

For Each wb In Application.Workbooks
  If wb.Name <> "PERSONAL.xlsb" Then
    
    'Add today's date to cell A1 of first worksheet in workbook
      wb.Worksheets(1).Range("A1") = Date
  
  End If
Next wb

End Sub
Option Explicit
                      'Remember to add a reference to Microsoft Visual Basic for Applications Extensibility 
                      'Exports all VBA project components containing code to a folder in the same directory as this spreadsheet.
                      Public Sub ExportAllComponents()
                          Dim VBComp As VBIDE.VBComponent
                          Dim destDir As String, fName As String, ext As String 
                          'Create the directory where code will be created.
                          'Alternatively, you could change this so that the user is prompted
                          If ActiveWorkbook.Path = "" Then
                              MsgBox "You must first save this workbook somewhere so that it has a path.", , "Error"
                              Exit Sub
                          End If
                          destDir = ActiveWorkbook.Path & "\" & ActiveWorkbook.Name & " Modules"
                          If Dir(destDir, vbDirectory) = vbNullString Then MkDir destDir
                          
                          'Export all non-blank components to the directory
                          For Each VBComp In ActiveWorkbook.VBProject.VBComponents
                              If VBComp.CodeModule.CountOfLines > 0 Then
                                  'Determine the standard extention of the exported file.
                                  'These can be anything, but for re-importing, should be the following:
                                  Select Case VBComp.Type
                                      Case vbext_ct_ClassModule: ext = ".cls"
                                      Case vbext_ct_Document: ext = ".cls"
                                      Case vbext_ct_StdModule: ext = ".bas"
                                      Case vbext_ct_MSForm: ext = ".frm"
                                      Case Else: ext = vbNullString
                                  End Select
                                  If ext <> vbNullString Then
                                      fName = destDir & "\" & VBComp.Name & ext
                                      'Overwrite the existing file
                                      'Alternatively, you can prompt the user before killing the file.
                                      If Dir(fName, vbNormal) <> vbNullString Then Kill (fName)
                                      VBComp.Export (fName)
                                  End If
                              End If
                          Next VBComp
                      End Sub
                      
' Req'd Refs: Late Binding  -> None required
'             Early Binding -> Microsoft Scripting Runtime
#Const FSO_EarlyBind = True
#If FSO_EarlyBind = True Then
    Private pFSO                As Scripting.FileSystemObject
#Else
    Private pFSO                As Object
#End If


#If FSO_EarlyBind = True Then
Public Function oFSO() As Scripting.FileSystemObject
#Else
Public Function oFSO() As Object
#End If
    If pFSO Is Nothing Then
        #If FSO_EarlyBind = True Then
            Set pFSO = New FileSystemObject
        #Else
            Set pFSO = CreateObject("Scripting.FileSystemObject")
        #End If
    End If
    Set oFSO = pFSO
End Function

Public Sub oFSO_Clear()
    'Be sure to always run this when closing your Form/DB to avoid
    '   hidden instances from running in the background!
    Set pFSO = Nothing
End Sub
Sub SendOutlookMessages()'Dimension variables.
    Dim OL As Object, MailSendItem As Object
    Dim W As Object
    Dim MsgTxt As String, SendFile As String
    Dim ToRangeCounter As Variant
    
    'Identifies Word file to send
    SendFile = Application.GetOpenFilename(Title:="Select MS Word " & _
    "file to mail, then click 'Open'", buttontext:="Send", _
    MultiSelect:=False)'Starts Word session
    Set W = GetObject(SendFile)'Pulls text from file for message body
    MsgTxt = W.Range(Start:=W.Paragraphs(1).Range.Start, _
    End:=W.Paragraphs(W.Paragraphs.Count).Range.End)'Ends Word session
    Set W = Nothing
    
    'Starts Outlook session
    Set OL = CreateObject("Outlook.Application")
    Set MailSendItem = OL.CreateItem(olMailItem)
    
    ToRangeCounter = 0
    
    'Identifies number of recipients for To list.
    For Each xCell In ActiveSheet.Range(Range("tolist"), _
    Range("tolist").End(xlToRight))
    ToRangeCounter = ToRangeCounter + 1
    Next xCell
    
    If ToRangeCounter = 256 Then ToRangeCounter = 1
    
    'Creates message
    With MailSendItem
    .Subject = ActiveSheet.Range("subjectcell").Text
    .Body = MsgTxt
    
    'Creates "To" list
    For Each xRecipient In Range("tolist").Resize(1, ToRangeCounter)
    RecipientList = RecipientList & ";" & xRecipient
    Next xRecipient
    
    .To = RecipientList
    .Send
    End With
    
    'Ends Outlook session
    Set OL = Nothing
    
End Sub
Sub SendOutlookMessages()'Dimension variables.
    Dim OL As Object, MailSendItem As Object
    Dim W As Object
    Dim MsgTxt As String, SendFile As String
    Dim ToRangeCounter As Variant
    
    'Identifies Word file to send
    SendFile = Application.GetOpenFilename(Title:="Select MS Word " & _
    "file to mail, then click 'Open'", buttontext:="Send", _
    MultiSelect:=False)'Starts Word session
    Set W = GetObject(SendFile)'Pulls text from file for message body
    MsgTxt = W.Range(Start:=W.Paragraphs(1).Range.Start, _
    End:=W.Paragraphs(W.Paragraphs.Count).Range.End)'Ends Word session
    Set W = Nothing
    
    'Starts Outlook session
    Set OL = CreateObject("Outlook.Application")
    Set MailSendItem = OL.CreateItem(olMailItem)
    
    ToRangeCounter = 0
    
    'Identifies number of recipients for To list.
    For Each xCell In ActiveSheet.Range(Range("tolist"), _
    Range("tolist").End(xlToRight))
    ToRangeCounter = ToRangeCounter + 1
    Next xCell
    
    If ToRangeCounter = 256 Then ToRangeCounter = 1
    
    'Creates message
    With MailSendItem
    .Subject = ActiveSheet.Range("subjectcell").Text
    .Body = MsgTxt
    
    'Creates "To" list
    For Each xRecipient In Range("tolist").Resize(1, ToRangeCounter)
    RecipientList = RecipientList & ";" & xRecipient
    Next xRecipient
    
    .To = RecipientList
    .Send
    End With
    
    'Ends Outlook session
    Set OL = Nothing
    
End Sub
' Variable declarations
Dim blNotFirstIteration As Boolean
Dim Fil As File
Dim hFolder As Folder, SubFolder As Folder
Dim FileExt As String
Dim FSO As Scripting.FileSystemObject

' Recursive procedure for iterating through all files in all subfolders
' of a folder and locating specific file types by file extension.
Sub FindFilesInFolders(ByVal HostFolder As String, FileTypes As Variant)
'(1) This routine uses Early Binding so you must add reference to Microsoft Scripting Runtime:
' Tools > References > Microsoft Scripting Runtime
'(2) Call procedure using a command like:
' Call FindFilesInFolders("C:\Users\MHS\Documents", Array("xlsm", "xlsb"))
    If FSO Is Nothing Then Set FSO = New Scripting.FileSystemObject
    Set hFolder = FSO.GetFolder(HostFolder)

    ' iterate through all files in the root of the main folder
    If Not blNotFirstIteration Then
      For Each Fil In hFolder.Files
          FileExt = FSO.GetExtensionName(Fil.Path)
    
          ' check if current file matches one of the specified file types
          If Not IsError(Application.Match(FileExt, FileTypes, 0)) Then
              ' ****************************************
              ' Insert your code here
              ' ****************************************
              Cells(WorksheetFunction.CountA(Range("A:A")) + 1, 1) = Fil.Path
          End If
      Next Fil
    
      ' make recursive call, if main folder contains subfolder
      If Not hFolder.SubFolders Is Nothing Then
          blNotFirstIteration = True
          Call FindFilesInFolders(HostFolder, FileTypes)
      End If
    
    ' iterate through all files in all the subfolders of the main folder
    Else
      For Each SubFolder In hFolder.SubFolders
          For Each Fil In SubFolder.Files
              FileExt = FSO.GetExtensionName(Fil.Path)
    
              ' check if current file matches one of the specified file types
              If Not IsError(Application.Match(FileExt, FileTypes, 0)) Then
                  ' ****************************************
                  ' Insert your code here
                  ' ****************************************
                  Cells(WorksheetFunction.CountA(Range("A:A")) + 1, 1) = Fil.Path
              End If
          Next Fil
    
          ' make recursive call, if subfolder contains subfolders
          If Not SubFolder.SubFolders Is Nothing Then _
              Call FindFilesInFolders(HostFolder & "\" & SubFolder.Name, FileTypes)
    
      Next SubFolder
    End If
    blNotFirstIteration = False
End Sub
Sub AllEnvironVariables()
    Dim strEnviron As String
    Dim VarSplit As Variant
    Dim i As Long
    For i = 1 To 255
        strEnviron = Environ$(i)
        If LenB(strEnviron) = 0& Then GoTo TryNext:
        VarSplit = Split(strEnviron, "=")
        If UBound(VarSplit) > 1 Then Stop
        Range("A" & Range("A" & Rows.Count).End(xlUp).Row + 1).Value = i
        Range("B" & Range("B" & Rows.Count).End(xlUp).Row + 1).Value = VarSplit(0)
        Range("C" & Range("C" & Rows.Count).End(xlUp).Row + 1).Value = VarSplit(1)
TryNext:
    Next
End Sub
Sub GetWordData()
'Note: this code requires a reference to the Word object model. See under the VBE's Tools|References.
Application.ScreenUpdating = False
Dim wdApp As New Word.Application, wdDoc As Word.Document, c As Long, r As Long
Dim strFolder As String, strFile As String, WkBk As Workbook, WkSht As Worksheet
strFolder = GetFolder: If strFolder = "" Then GoTo ErrExit
Set WkBk = ActiveWorkbook
strFile = Dir(strFolder & "\*.docx", vbNormal)
While strFile <> ""
  Set wdDoc = wdApp.Documents.Open(Filename:=strFolder & "\" & strFile, AddToRecentFiles:=False, Visible:=False)
  Set WkSht = WkBk.Sheets.Add: r = 4
  WkSht.Name = Split(strFile, ".doc")(0)
  WkBk.Sheets(1).Range.Copy
  WkSht.Paste
  WkSht.Range("A2").Value = WkSht.Name
  With wdDoc
    With .Range
      With .Find
        .ClearFormatting
        .Replacement.ClearFormatting
        'Find blocks of text of interest
        .Text = "Uid:*Units:*^13"
        .Replacement.Text = ""
        .Forward = True
        .Wrap = wdFindStop
        .MatchWildcards = True
        .Execute
      End With
      Do While .Find.Found
        r = r + 1
        'Parse & write the text to Excel
        For c = 1 To 4
          WkSht.Cells(r, c).Value = Trim(Split(Split(.Text, vbCr)(c - 1), ":")(1))
        Next
        .Collapse wdCollapseEnd
        .Find.Execute
      Loop
    End With
    .Close SaveChanges:=False
  End With
  strFile = Dir()
Wend
ErrExit:
wdApp.Quit
Set wdDoc = Nothing: Set wdApp = Nothing: Set WkSht = Nothing: Set WkBk = Nothing
Application.ScreenUpdating = True
End Sub

Function GetFolder() As String
    Dim oFolder As Object
    GetFolder = ""
    Set oFolder = CreateObject("Shell.Application").BrowseForFolder(0, "Choose a folder", 0)
    If (Not oFolder Is Nothing) Then GetFolder = oFolder.Items.Item.Path
    Set oFolder = Nothing
End Function
Sub GetWordData()
'Note: this code requires a reference to the Word object model. See under the VBE's Tools|References.
Application.ScreenUpdating = False
Dim wdApp As New Word.Application, wdDoc As Word.Document, c As Long, r As Long
Dim strFolder As String, strFile As String, WkBk As Workbook, WkSht As Worksheet
strFolder = GetFolder: If strFolder = "" Then GoTo ErrExit
Set WkBk = ActiveWorkbook
strFile = Dir(strFolder & "\*.docx", vbNormal)
While strFile <> ""
  Set wdDoc = wdApp.Documents.Open(Filename:=strFolder & "\" & strFile, AddToRecentFiles:=False, Visible:=False)
  Set WkSht = WkBk.Sheets.Add: r = 4
  WkSht.Name = Split(strFile, ".doc")(0)
  WkBk.Sheets(1).Range.Copy
  WkSht.Paste
  WkSht.Range("A2").Value = WkSht.Name
  With wdDoc
    With .Range
      With .Find
        .ClearFormatting
        .Replacement.ClearFormatting
        'Find blocks of text of interest
        .Text = "Uid:*Units:*^13"
        .Replacement.Text = ""
        .Forward = True
        .Wrap = wdFindStop
        .MatchWildcards = True
        .Execute
      End With
      Do While .Find.Found
        r = r + 1
        'Parse & write the text to Excel
        For c = 1 To 4
          WkSht.Cells(r, c).Value = Trim(Split(Split(.Text, vbCr)(c - 1), ":")(1))
        Next
        .Collapse wdCollapseEnd
        .Find.Execute
      Loop
    End With
    .Close SaveChanges:=False
  End With
  strFile = Dir()
Wend
ErrExit:
wdApp.Quit
Set wdDoc = Nothing: Set wdApp = Nothing: Set WkSht = Nothing: Set WkBk = Nothing
Application.ScreenUpdating = True
End Sub

Function GetFolder() As String
    Dim oFolder As Object
    GetFolder = ""
    Set oFolder = CreateObject("Shell.Application").BrowseForFolder(0, "Choose a folder", 0)
    If (Not oFolder Is Nothing) Then GetFolder = oFolder.Items.Item.Path
    Set oFolder = Nothing
End Function
Sub ShowDriveList
    Dim fs, d, dc, s, n
    Set fs = CreateObject("Scripting.FileSystemObject")
    Set dc = fs.Drives
    For Each d in dc
        s = s & d.DriveLetter & " - " 
        If d.DriveType = 3 Then
            n = d.ShareName
        Else
            n = d.VolumeName
        End If
        s = s & n & vbCrLf
    Next
    MsgBox s
End Sub
Public Function NameOf(Optional ByVal This As Variant = 0, Optional ByVal Target As Range = Nothing) As Variant
' User-Defined Function (UDF) to return Target's Worksheet.Name, Workbook.Name, or Workbook.Path
' otherwise, return Application.Name and .Version, .Caption, .StatusBar, .UserName, .OrganizationName, or .ActivePrinter
' otherwise, return environment variable "COMPUTERNAME" or any environment variable named by This (ignoring alphabetic case)
' SYNTAX: NameOf([This],[Target])
' Default This is 0 (or "sheet" or "worksheet")
' This = 0 or "sheet" or "worksheet" return Target's Worksheet.Name (default)
' This = 1 or "book" or "workbook" return Target's Workbook.Name
' This = 2 or "path" or "filepath" return Target's Workbook.Path
' This = 3 or "app" or "application" return Application.Name and Application.Version
' This = 4 or "caption" or "titlebar" return Application.Caption
' This = 5 or "statusbar" return Application.StatusBar ("Default" unless set by a macro)
' This = 6 or "user" return Application.UserName
' This = 7 or "organization" return Application.OrganizationName
' This = 8 or "printer" return Application.ActivePrinter
' This = 9 or "computer" return Environ("COMPUTERNAME")
' This = "?" or "help" return text list of recognized This
' This = any string not listed above return Environ(This)
' If Target is Nothing (default), then Target is set to the cell referencing this function (error if referenced in a VBA statement)
' otherwise, Target should be a Worksheet cell's address (like $A$1 or Sheet1!A1) or VBA Range such as Range("$A$1")
' Patterned after Excel's built-in information functions CELL and INFO
' DEVELOPER: J. Woolley (for wellsr.com)
    Dim vResult As Variant
    Application.Volatile
    If Not IsNumeric(This) Then This = Trim(LCase(This))
    Select Case This
    Case 0, "sheet", "worksheet": 
		If Target Is Nothing Then Set Target = Application.ThisCell
		vResult = Target.Parent.Name
    Case 1, "book", "workbook": 
		If Target Is Nothing Then Set Target = Application.ThisCell
		vResult = Target.Parent.Parent.Name
    Case 2, "path", "filepath": 
		If Target Is Nothing Then Set Target = Application.ThisCell
		vResult = Target.Parent.Parent.Path
    Case 3, "app", "application": 
		vResult = Application.Name & " " & Application.Version
    Case 4, "caption", "titlebar": 
		vResult = Application.Caption
    Case 5, "statusbar":
        vResult = Application.StatusBar
        If Not vResult Then vResult = "Default"
    Case 6, "user": 
		vResult = Application.UserName
    Case 7, "organization": 
		vResult = Application.OrganizationName
    Case 8, "printer": 
		vResult = Application.ActivePrinter
    Case 9, "computer": 
		vResult = Environ("COMPUTERNAME")
    Case "?", "help":
        vResult = "Worksheet, Workbook, Filepath, Application, Titlebar, Statusbar, User, Organization, Printer, Computer (EnvVar)"
    Case Else:
        vResult = Environ(CStr(This))
        If vResult = "" Then vResult = CVErr(xlErrValue)      ' #VALUE! (Error 2015)
    End Select
    NameOf = vResult
End Function
Sub GetWordData()
'Note: this code requires a reference to the Word object model. See under the VBE's Tools|References.
Application.ScreenUpdating = False
Dim wdApp As New Word.Application, wdDoc As Word.Document, c As Long, r As Long
Dim strFolder As String, strFile As String, WkBk As Workbook, WkSht As Worksheet
strFolder = GetFolder: If strFolder = "" Then GoTo ErrExit
Set WkBk = ActiveWorkbook
strFile = Dir(strFolder & "\*.docx", vbNormal)
While strFile <> ""
  Set wdDoc = wdApp.Documents.Open(Filename:=strFolder & "\" & strFile, AddToRecentFiles:=False, Visible:=False)
  Set WkSht = WkBk.Sheets.Add: r = 4
  WkSht.Name = Split(strFile, ".doc")(0)
  WkBk.Sheets(1).Range.Copy
  WkSht.Paste
  WkSht.Range("A2").Value = WkSht.Name
  With wdDoc
    With .Range
      With .Find
        .ClearFormatting
        .Replacement.ClearFormatting
        'Find blocks of text of interest
        .Text = "Uid:*Units:*^13"
        .Replacement.Text = ""
        .Forward = True
        .Wrap = wdFindStop
        .MatchWildcards = True
        .Execute
      End With
      Do While .Find.Found
        r = r + 1
        'Parse & write the text to Excel
        For c = 1 To 4
          WkSht.Cells(r, c).Value = Trim(Split(Split(.Text, vbCr)(c - 1), ":")(1))
        Next
        .Collapse wdCollapseEnd
        .Find.Execute
      Loop
    End With
    .Close SaveChanges:=False
  End With
  strFile = Dir()
Wend
ErrExit:
wdApp.Quit
Set wdDoc = Nothing: Set wdApp = Nothing: Set WkSht = Nothing: Set WkBk = Nothing
Application.ScreenUpdating = True
End Sub

Function GetFolder() As String
    Dim oFolder As Object
    GetFolder = ""
    Set oFolder = CreateObject("Shell.Application").BrowseForFolder(0, "Choose a folder", 0)
    If (Not oFolder Is Nothing) Then GetFolder = oFolder.Items.Item.Path
    Set oFolder = Nothing
End Function
  <h4 className="text-2xl font-bold my-10">{reportData.introdcution.performance_control.title}</h4>
    <p className="mb-6">{reportData.introdcution.performance_control.description}</p>
    <table className="table-auto w-full">
      <caption className="text-lg font-semibold mb-6">{reportData.introdcution.performance_control.table.caption}</caption>
      <thead>
        <tr className="bg-gray-200">
          {Object.values(reportData.introdcution.performance_control.table.column_names).map((columnName, index) => (
            <th key={index} className="px-4 py-2">{columnName}</th>
          ))}
        </tr>
      </thead>
      <tbody>
      {isEditing ? (
          reportData.introdcution.performance_control.table.data.map((rowData, rowIndex) => (
            <tr key={rowIndex} className="bg-white">
              <td className="px-4 py-2">
                <input
                  type="number"
                  className="w-full p-2 rounded-lg border border-gray-300"
                  value={editedData.introdcution.performance_control.table.data[rowIndex].insurance_revenue}
                  onChange={(e) => handleInputChange(e, `introdcution.performance_control.table.data[${rowIndex}].insurance_revenue`)}
                />
              </td>
              <td className="px-4 py-2">
                <input
                  type="number"
                  className="w-full p-2 rounded-lg border border-gray-300"
                  value={editedData.introdcution.performance_control.table.data[rowIndex].loss}
                  onChange={(e) => handleInputChange(e, `introdcution.performance_control.table.data[${rowIndex}].losse`)}
                />
              </td>
              <td className="px-4 py-2">
                <input
                  type="number"
                  className="w-full p-2 rounded-lg border border-gray-300"
                  value={editedData.introdcution.performance_control.table.data[rowIndex].commission_cost}
                  onChange={(e) => handleInputChange(e, `introdcution.performance_control.table.data[${rowIndex}].commission_cost`)}
                />
              </td>
              <td className="px-4 py-2">
                <input
                  type="number"
                  className="w-full p-2 rounded-lg border border-gray-300"
                  value={editedData.introdcution.performance_control.table.data[rowIndex].administrative_costs}
                  onChange={(e) => handleInputChange(e, `introdcution.performance_control.table.data[${rowIndex}].administrative_costs`)}
                />
              </td>
              <td className="px-4 py-2">
                <input
                  type="number"
                  className="w-full p-2 rounded-lg border border-gray-300"
                  value={editedData.introdcution.performance_control.table.data[rowIndex].other_operational_costs}
                  onChange={(e) => handleInputChange(e, `introdcution.performance_control.table.data[${rowIndex}].other_operational_costs`)}
                />
              </td>
              <td className="px-4 py-2">
                <input
                  type="number"
                  className="w-full p-2 rounded-lg border border-gray-300"
                  value={editedData.introdcution.performance_control.table.data[rowIndex].non_operational_costs}
                  onChange={(e) => handleInputChange(e, `introdcution.performance_control.table.data[${rowIndex}].non_operational_costs`)}
                />
              </td>
              <td className="px-4 py-2">
                <input
                  type="number"
                  className="w-full p-2 rounded-lg border border-gray-300"
                  value={editedData.introdcution.performance_control.table.data[rowIndex].personnel_costs}
                  onChange={(e) => handleInputChange(e, `introdcution.performance_control.table.data[${rowIndex}].personnel_costs`)}
                />
              </td>
              <td className="px-4 py-2">
                <input
                  type="number"
                  className="w-full p-2 rounded-lg border border-gray-300"
                  value={editedData.introdcution.performance_control.table.data[rowIndex].depreciation_costs}
                  onChange={(e) => handleInputChange(e, `introdcution.performance_control.table.data[${rowIndex}].depreciation_costs`)}
                />
              </td>
              <td className="px-4 py-2">
                <input
                  type="number"
                  className="w-full p-2 rounded-lg border border-gray-300"
                  value={editedData.introdcution.performance_control.table.data[rowIndex].cost_ratio}
                  onChange={(e) => handleInputChange(e, `introdcution.performance_control.table.data[${rowIndex}].cost_ratio`)}
                />
              </td>
              <td className="px-4 py-2">
                <input
                  type="number"
                  className="w-full p-2 rounded-lg border border-gray-300"
                  value={editedData.introdcution.performance_control.table.data[rowIndex].profit_lost}
                  onChange={(e) => handleInputChange(e, `introdcution.performance_control.table.data[${rowIndex}].profit_lost`)}
                />
              </td>
              
            </tr>
          ))
        ) : (
        reportData.introdcution.performance_control.table.data.map((rowData, rowIndex) => (
          <tr key={rowIndex} className={rowIndex % 2 === 0 ? "bg-gray-100" : "bg-white"}>
            <td className="px-4 py-2">{rowData.insurance_revenue}</td>
            <td className="px-4 py-2">{rowData.loss}</td>
            <td className="px-4 py-2">{rowData.commission_cost}</td>
            <td className="px-4 py-2">{rowData.administrative_costs}</td>
            <td className="px-4 py-2">{rowData.other_operational_costs}</td>
            <td className="px-4 py-2">{rowData.non_operational_costs}</td>
            <td className="px-4 py-2">{rowData.personnel_costs}</td>
            <td className="px-4 py-2">{rowData.depreciation_costs}</td>
            <td className="px-4 py-2">{rowData.cost_ratio}</td>
            <td className="px-4 py-2">{rowData.profit_lost}</td>
            </tr>
          ))
        )}
        
      </tbody>
    </table>
Pro Zeile einen Ordnername
MD Ordnername1
Keine Leerzeichen im Ordnername (_ geht)
Keine Komma im Ordnername (# geht)
In TXT Datei speichern als textdatei.bat
Datei dopelklicken in dem Ordner in dem die neuen Ordner gebraucht werden. 
Ordner werden erstellt
field("Parent No."; Rec."Parent No.")
{
    ApplicationArea = All;

    trigger OnDrillDown()
    var
        ChildTablePage: Page ChildTablePage;
        ChildTableRecord: Record ChildTable;
    begin
        ChildTableRecord.SetRange(ChildTableRecord."Parent No.", Rec."Parent No.");
        ChildTablePage.SetTableView(ChildTableRecord);
        ChildTablePage.Run();
    end;
}
const model = this.data.model,
    records = this.data.selectedRecords;
let values = records.map( r => model.getValue( r, "JCLASS_DISPLAY" ) ); 

apex.item( "P230_CURRENT_JNYID" ).setValue( values[0] );
position: -webkit-sticky; //Safari
position: sticky;
top: 120px;

// apply css overflow: visible; or overflow: auto; div all parent
<!--
  Hit RUN to see this project in action!
  
  This project will auto-refresh as you edit the HTML, CSS and JS. See README.md for more info (including how to disable auto-refresh and install packages).
-->

<!DOCTYPE html>
<html>

<head>
  <meta charset="utf-8">
  <meta name="viewport" content="width=device-width">
  <title>Replit</title>
  <link href="style.css" rel="stylesheet" type="text/css" />
</head>

<body>
 <form onsubmit="return data()"    >
   Name               <input type = "text" id= "a"> <br>
   Age <input type = "number" id= "b"> <br>
   Email <input type = "email" id= "c"> <br>
    Phone <input type = "number" id= "d"> <br>
    Password <input type = "text" id= "e"> <br>
    Re-enter Password <input type = "text" id= "f"> <br>
 <input type="submit" >
 </form>

  <script type="module" src="script.js"></script>

</body>

</html>













function data(){
let a= document.getElementById("a");
let b= document.getElementById("b");
let c= document.getElementById("c");
let d= document.getElementById("d");
let e= document.getElementById("e");
let f= document.getElementById("f");
  
  if(a==""||b==""||c==""||d==""){
    alert("all entries are mandatory");
    return false;
  }else if(isNaN(c)){
    alert("phone number must be a number");
  }else if(blur.length!=10){
    alert(" 10 digit phone no is required");
  }else if(e!=f){
   alert("passwords must be same"); 
  }
  else{
    return true;
  }
}
void DFS( int v){ 

 Thăm_Đỉnh(v);

 chuaxet[v]:= FALSE; 

 for ( u ∈ke(v) ) { 

  if (chuaxet[u] ) DFS(u); 

 } 

}
/**
 *  Custom cart redirection: / home page when cart is empty and checkout page if cart is not empty
 */

add_action('template_redirect', 'custom_cart_redirections');
function custom_cart_redirections() {
    if ( is_cart() ) {
        if ( WC()->cart->is_empty() ) {
            wp_redirect( home_url('catalog') );
            exit();
        } else {
            wp_redirect( wc_get_checkout_url() );
            exit();
        }
    }
}
// Skip the Cart Page when add to cart button
add_filter('add_to_cart_redirect', 'cw_redirect_add_to_cart');
function cw_redirect_add_to_cart() {
   global $woocommerce;
   $cw_redirect_url_checkout = $woocommerce->cart->get_checkout_url();
   return $cw_redirect_url_checkout;
}
<?php
/*
Plugin Name: Dokan Product Categories Additional Fees
Plugin URI: https://example.com
Description: Adds an "Additional Fees" field to WooCommerce product categories and displays additional fees for orders with products from multiple vendors based on the "Additional Fees" value.
Version: 1.0
Author: Your Name
Author URI: https://example.com
*/

// Exit if accessed directly
if (!defined('ABSPATH')) {
   exit;
}

function enqueue_sweetalert2() {
    wp_enqueue_style('sweetalert2', 'https://cdn.jsdelivr.net/npm/sweetalert2@11.7.3/dist/sweetalert2.min.css');
    wp_enqueue_script('sweetalert2', 'https://cdn.jsdelivr.net/npm/sweetalert2@11.7.3/dist/sweetalert2.all.min.js', array('jquery'), null, true);
}
add_action('wp_enqueue_scripts', 'enqueue_sweetalert2');

// Enqueue the JavaScript file


// Save the "Additional Fees" field value when adding/editing a product category
add_action('created_term', 'save_additional_fees_field', 10, 3);
add_action('edit_term', 'save_additional_fees_field', 10, 3);
function save_additional_fees_field($term_id, $tt_id, $taxonomy)
{
   if ('product_cat' !== $taxonomy) {
       return;
   }

   $additional_fees = isset($_POST['additional_fees']) ? sanitize_text_field($_POST['additional_fees']) : '';
   update_term_meta($term_id, 'additional_fees', $additional_fees);
}

// Add the "Additional Fees" field to the product category add/edit page
add_action('product_cat_add_form_fields', 'add_additional_fees_field');
add_action('product_cat_edit_form_fields', 'edit_additional_fees_field', 10, 2);
function add_additional_fees_field()
{
   ?>
   <div class="form-field term-additional-fees-wrap">
       <label for="additional-fees"><?php esc_html_e('Additional Fees', 'woocommerce'); ?></label>
       <input type="text" name="additional_fees" id="additional-fees" value="">
   </div>
   <?php
}

function edit_additional_fees_field($term, $taxonomy)
{
   $additional_fees = get_term_meta($term->term_id, 'additional_fees', true);
   ?>
   <tr class="form-field term-additional-fees-wrap">
       <th scope="row"><label for="additional-fees"><?php esc_html_e('Additional Fees', 'woocommerce'); ?></label></th>
       <td><input type="text" name="additional_fees" id="additional-fees" value="<?php echo esc_attr($additional_fees); ?>"></td>
   </tr>
   <?php
}

/**
* Display Additional Fees message in the cart
*/
add_action('woocommerce_cart_totals_before_order_total', 'display_additional_fees_in_cart');
function display_additional_fees_in_cart()
{
   $product_id = get_the_ID();
   $product_categories = wp_get_post_terms($product_id, 'product_cat', array('fields' => 'ids'));

   // Iterate through the categories and get the additional fees
   $additional_fees = 0;
   foreach ($product_categories as $category_id) {
       $category_additional_fees = get_term_meta($category_id, 'additional_fees', true);
       if (!empty($category_additional_fees)) {
           $additional_fees = max($additional_fees, $category_additional_fees);
       }
   }

   // Display the additional fees if they exist
   if ($additional_fees > 0) {
       echo '<div class="woocommerce-notices-wrapper">';
       echo '<ul class="woocommerce-error" role="alert">';
       echo '<li>' . esc_html__('رسوم إضافية:', 'woocommerce') . ' ' . wc_price($additional_fees) . '</li>';
       echo '</ul>';
       echo '</div>';
   }
}

/**
* Display Additional Fees message on the product page
*/
add_action('woocommerce_before_add_to_cart_button', 'display_additional_fees_message');
function display_additional_fees_message() {
    global $product;

    // Get the product categories
    $product_categories = wp_get_post_terms($product->get_id(), 'product_cat', array('fields' => 'ids'));

    // Iterate through the categories and get the additional fees
    $additional_fees = 0;
    foreach ($product_categories as $category_id) {
        $category_additional_fees = get_term_meta($category_id, 'additional_fees', true);
        if (!empty($category_additional_fees)) {
            $additional_fees = max($additional_fees, $category_additional_fees);
        }
    }

    // Get the vendor ID for this product
    $vendor_id = get_post_field('post_author', $product->get_id());

    // Check if there are products from other vendors in the cart
    $other_vendors = false;
    foreach (WC()->cart->get_cart() as $cart_item) {
        $product_id = $cart_item['product_id'];
        $item_vendor_id = get_post_field('post_author', $product_id);
        if ($item_vendor_id != $vendor_id) {
            $other_vendors = true;
            break;
        }
    }

    // Display the message if additional fees exist and there are products from other vendors in the cart
    if ($additional_fees > 0 && $other_vendors) {
        ?>
        <script type="text/javascript">
        (function($) {
            $('form.cart').on('submit', function(e) {
                e.preventDefault();
                Swal.fire({
                    title: '<?php esc_html_e('رسوم إضافية', 'woocommerce'); ?>',
                    html: '<?php echo sprintf(esc_html__('سيتم تطبيق رسوم إضافية بقيمة %s على طلبك.', 'woocommerce'), wc_price($additional_fees)); ?>',
                    icon: 'warning',
                    confirmButtonText: '<?php esc_html_e('موافق', 'woocommerce'); ?>'
                }).then((result) => {
                    if (result.isConfirmed) {
                        $(this).unbind('submit').submit();
                    }
                });
            });
        })(jQuery);
        </script>
        <?php
    }
}

add_action('wp_ajax_display_multi_vendor_warning', 'display_multi_vendor_warning');
add_action('wp_ajax_nopriv_display_multi_vendor_warning', 'display_multi_vendor_warning');
function display_multi_vendor_warning() {
    $product_ids = $_POST['product_ids'];

    $vendors = array();
    foreach ($product_ids as $product_id) {
        $vendor_id = get_post_field('post_author', $product_id);
        $vendors[$vendor_id] = true;
    }

    if (count($vendors) > 1) {
        $response = array(
            'success' => true,
            'message' => esc_html__('سلة التسوق الخاصة بك تحتوي على منتجات من عدة بائعين. قد تطبق رسوم إضافية.', 'woocommerce')
        );
    } else {
        $response = array(
            'success' => false,
            'message' => ''
        );
    }

    wp_send_json($response);
}

/**
 * Display a warning message if cart contains products from multiple vendors
 */
function add_additional_fees_script_to_footer() {
    ?>
    <script type="text/javascript">
    (function($) {
        var $woocommerce_div = $('div.woocommerce');

        function check_and_display_multi_vendor_warning() {
            var product_ids = [];
            $('div.woocommerce-cart-form__cart-item').each(function() {
                var $product_id = $(this).data('product_id');
                product_ids.push($product_id);
            });

            $.ajax({
                type: 'POST',
                url: '<?php echo admin_url('admin-ajax.php'); ?>',
                data: {
                    action: 'display_multi_vendor_warning',
                    product_ids: product_ids
                },
                success: function(response) {
                    if (response.success) {
                        $message = response.message;
                        if ($message) {
                            $woocommerce_div.prepend('<div class="woocommerce-notices-wrapper">' +
                                '<ul class="woocommerce-error" role="alert">' +
                                '<li>' + $message + '</li>' +
                                '</ul>' +
                                '</div>');
                        } else {
                            $woocommerce_div.find('.woocommerce-notices-wrapper').remove();
                        }
                    }
                },
                error: function() {
                    console.log('Error displaying multi-vendor warning');
                }
            });
        }

        $(document).ready(function() {
            check_and_display_multi_vendor_warning();
        });

        $woocommerce_div.on('updated_wc_div', function() {
            check_and_display_multi_vendor_warning();
        });
    })(jQuery);
    </script>
    <?php
}
add_action('wp_footer', 'add_additional_fees_script_to_footer');
//=========================================================================================================
function calculate_additional_fees() {
    $additional_fees = 0;

    foreach (WC()->cart->get_cart() as $cart_item) {
        $product_id = $cart_item['product_id'];
        $product_categories = wp_get_post_terms($product_id, 'product_cat', array('fields' => 'ids'));

        foreach ($product_categories as $category_id) {
            $category_additional_fees = get_term_meta($category_id, 'additional_fees', true);
            if (!empty($category_additional_fees)) {
                $additional_fees = max($additional_fees, $category_additional_fees);
            }
        }
    }

    return $additional_fees;
}
add_action('woocommerce_cart_calculate_fees', 'add_additional_fees_to_cart_total');
function add_additional_fees_to_cart_total(WC_Cart $cart) {
    $additional_fees = calculate_additional_fees();

    if ($additional_fees > 0) {
        $cart->add_fee(__('رسوم إضافية', 'woocommerce'), $additional_fees);
    }
}

//=================================================================================
/**
 * Display additional fees in order details
 */
add_action('woocommerce_admin_order_data_after_order_details', 'display_additional_fees_order_meta');
function display_additional_fees_order_meta($order) {
    $additional_fees = get_post_meta($order->get_id(), 'additional_fees', true);

    if (!empty($additional_fees)) {
        ?>
        <div class="order_data_column">
            <h4><?php esc_html_e('Additional Fees', 'woocommerce'); ?></h4>
            <p><?php echo wc_price($additional_fees); ?></p>
        </div>
        <?php
    }
}

/**
 * Save additional fees meta for the order
 */
add_action('woocommerce_checkout_create_order_line_item', 'save_additional_fees_order_meta', 10, 4);
function save_additional_fees_order_meta($item, $cart_item_key, $values, $order) {
    $additional_fees = calculate_additional_fees();

    if ($additional_fees > 0) {
        $order->update_meta_data('additional_fees', $additional_fees);
    }
}
&::-webkit-scrollbar {
  width: 5px;
}
  &::-webkit-scrollbar-track {
  background-color: #EBEBEB;
}
&::-webkit-scrollbar-thumb {
  background-color: #B9B9B9;
  border-radius: 5px;
}
## 1. Download the software package to it's own folder

##2. Launch terminal and use cd command to change to the Software Package's Folder 
cd (Folder where software package is)
##(or launch terminal through files program)

##3. Grant the Installer Executable Permisssions:
chmod a+x {PackageName}

##4. Run the Program using the following command:
./{PackageName}
Conditional statements:
1.Write PL/SQL Program to find the sum of two numbers.
2.Write PL/SQL Program to display even numbers in a given range.
3.Write PL/SQL Program to find the given number is prime or not.
4.Write PL/SQL Program to find the given number is perfect or not.
5.Write PL/SQL Program to find the given number is armstrong or not.
Functions
1.Write a Function to find Factorial of a given number.
2.Write a Function to find GCD of a two numbers.
3.Write a Function to find x^n.
Procedures
1.Write a Procedure to find Fibonacci series upto given range.
2.Write a Procedure to swap two numbers.
3.Write a Procedure to Reverse a number.
4.Write a Procedure to find the given number is Palindrome or not.
Cursors
1.Write a Program to check whether there is atleast one row satisfying given select statement or not using implict cursor.          
2.Write a Program to change the ename colummn values to uppercase using implict cursor.
3.Write a Program to update the salary of those employee to 20% whose salary is greater than the given salary,using implict cursor.
4.Write a Program to display details of employee using explicit cursor.
5.Write a Program using explicit cursor to display first 5 records only.
6.Write a Program using explicit cursor to insert values into a table empc from employee table,whose experience >=23.
7.Write a Program to display all employee's details working in the accepted department number using cursor for loop.
Exceptions
1.Write a Progrsm for creating an exception & raising it when the basic is <3000,while inserting rows into a table & also handle it to perform any other action.
2.Write a Program for creating an exception & raising it when ever you try to insert any negative number into a table.
3.Write a Program to handle value error exception.
4.Write a Program to raise inavlidCursor exception.
Triggers:
1.Write a trigger to display a message when Record is inserted in employee table(using before).
2.Write a trigger to display a message when Record is inserted in employee table(using After).
3.Write a trigger to display a message when Record is inserted or updated in employee table.






var url = "http://scratch99.com/web-development/javascript/";
var urlParts = url.replace('http://','').replace('https://','').split(/[/?#]/);
var domain = urlParts[0];
using System.Collections;
using System.Collections.Generic;
using UnityEngine;

public class BowlingBall : MonoBehaviour
{
    public float forwardForce;
    public float leftBorder;
    public float rightBorder;
    public float moveIncrement;

    public Rigidbody rig;

 

    public void Bowl ()
    {
        rig.AddForce(transform.forward * forwardForce, ForceMode.Impulse);
    }

    public void MoveLeft()
    {
        transform.position += new Vector3(-moveIncrement, 0, 0);
    }

}
#NoEnv  ; Recommended for performance and compatibility with future AutoHotkey releases.
; #Warn  ; Enable warnings to assist with detecting common errors.
SendMode Input  ; Recommended for new scripts due to its superior speed and reliability.
SetWorkingDir %A_ScriptDir%  ; Ensures a consistent starting directory.
#Persistent

; Hotkeys
^Numpad1::Copy(1)
^Numpad4::Paste(1)
^Numpad7::Clear(1)

^Numpad2::Copy(2)
^Numpad5::Paste(2)
^Numpad8::Clear(2)

^Numpad3::Copy(3)
^Numpad6::Paste(3)
^Numpad9::Clear(3)

Copy(clipboardID)
{
	global ; All variables are global by default
	local oldClipboard := ClipboardAll ; Save the (real) clipboard
	
	Clipboard = ; Erase the clipboard first, or else ClipWait does nothing
	Send ^c
	ClipWait, 2, 1 ; Wait 1s until the clipboard contains any kind of data
	if ErrorLevel 
	{
		Clipboard := oldClipboard ; Restore old (real) clipboard
		return
	}
	
	ClipboardData%clipboardID% := ClipboardAll
	
	Clipboard := oldClipboard ; Restore old (real) clipboard
}

Cut(clipboardID)
{
	global ; All variables are global by default
	local oldClipboard := ClipboardAll ; Save the (real) clipboard
	
	Clipboard = ; Erase the clipboard first, or else ClipWait does nothing
	Send ^x
	ClipWait, 2, 1 ; Wait 1s until the clipboard contains any kind of data
	if ErrorLevel 
	{
		Clipboard := oldClipboard ; Restore old (real) clipboard
		return
	}
	ClipboardData%clipboardID% := ClipboardAll
	
	Clipboard := oldClipboard ; Restore old (real) clipboard
}

Paste(clipboardID)
{
	global
	local oldClipboard := ClipboardAll ; Save the (real) clipboard

	Clipboard := ClipboardData%clipboardID%
	Send ^v

	Clipboard := oldClipboard ; Restore old (real) clipboard
	oldClipboard = 
}

Clear(clipboardID)
{
	global
	local oldClipboard := ClipboardAll ; Save the (real) clipboard

	Clipboard := ClipboardData%clipboardID%
	ClipboardData%clipboardID% :=

	Clipboard := oldClipboard ; Restore old (real) clipboard
	oldClipboard = 
}
from peewee import SqliteDatabase, Model, UUIDField, CharField, IntegerField
from uuid import uuid4

db = SqliteDatabase('mydb.db')

# Create user Model
class User(Model):
    userId = UUIDField(primary_key = True, default = uuid4)
    name = CharField(max_length = 10)
    age = IntegerField()

    class Meta:
        database = db

# Connect to db
db.connect()
db.create_tables([User])
db.commit()

# Add new user to database
user = User.create(name = 'user123', age = 20)
user.save()

# Get all users
for user in User.select():
    print(user.name, user.userId)
Hi! dear i have a Coat Pin Shop in Bangladesh. i want make purchase from you. i need customized Coat Pin for multiple Company coat pin and medal. so please let me know how you work. please email me.
Material: Metal/zinc alloy/iron/brass,
Size: Custom size
Plating: Gold/Silver/Black Nickel
Color: Custom colors
Logo: Customer Logo
Back accessories: Rubber buckle/butterfly cap/safety pin
transport: Courier/Marine/DHL UPS TNT FEDEX EMS
custom enamel pin: pin badge
Material: Metal
Printing: Letterpress printing
Printing: Gravure printing
Printing: Silk screen printing
Printing: Digital printing
Printing: UV printing
Printing: Thermal transfer printing
Printing: Embossing printing
Printing: Die cutting printing
Print Method: 1 color
Print Method: 2 color
Print Method: 4 color
Print Method: 5 color
Print Method: 6 color
Type: metal
Product Type: Badge & Emblem
Style: Cartoon, animal, love
Theme: Cartoon, animal, love
Regional Feature: China, Japan, United States, Europe, UAE, Australia
Technique: Die casting, stamping, soft enamel, hard enamel
Use: Souvenirs, gifts, decorations, promotions
div#comparison { 

  width: 0vw;

  height: 60vw;

  max-width: 600px;

  max-height: 600px;
6
  overflow: hidden; }

div#comparison figure { 

  background-image: url(https://s3-us-west-2.amazonaws.com/s.cdpn.io/4273/photoshop-face-before.jpg); 

  background-size: cover;

  position: relative;

  font-size: 0;

  width: 100%; 

  height: 100%;

  margin: 0; 

}

div#comparison figure > img { 

  position: relative;

  width: 100%;

}

div#comparison figure div { 

  background-image: url(https://s3-us-west-2.amazonaws.com/s.cdpn.io/4273/photoshop-face-after.jpg);

  background-size: cover;
<div id="comparison">

  <figure>

    <div id="divisor"></div>

  </figure>

  <input type="range" min="0" max="100" value="50" id="slider" oninput="moveDivisor()">

</div>

​
#include <iostream>
using namespace std;

int main() {
    int num;
    cout << "Keya Aap Ko Janna Hai Ki Yahan Jo aap No. Enter Ker Rahen Hain Wo Even Hai Yo Odd? : " << endl;
    cout << "To Der Kis Baat Ki Number Enter Karen Aur Dekhen Mere Dimag ka Kamal: " << endl;
    cin >> num;
    if (num % 2 == 0)
        cout << "    ----- Ye Even No. Hai Agar Main Sahi Houn To Mere Channal Ko Like Karen Thanks." << endl;
    else
        cout << "    ----- Ye Odd No. Hai Agar Main Sahi Houn To Mere Channal Ko Like Karen Thanks. " << endl;
    return 0;
}
String objType='Contact';
Map<String, Schema.SObjectType> schemaMap = Schema.getGlobalDescribe();
Schema.SObjectType leadSchema = schemaMap.get(objType);
Map<String, Schema.SObjectField> fieldMap = leadSchema.getDescribe().fields.getMap();
List<String> shagni = new List<String>();

for (String fieldName: fieldMap.keySet()) {
  Schema.DisplayType fielddataType = fieldMap.get(fieldName).getDescribe().getType();
  System.debug(fielddataType);
}
#include <iostream>
using namespace std;

int main() {
    int num1 = 5, num2 = 3;
    int sum = num1 + num2;
    cout << "5 Aur 3 Ko Jodna Tha Na Ans Hai : " << sum << endl;
    cout << "Agar Main Sahi Houn To Muskura Dijye Smile PLZ........." << endl;
    return 0;
}
#include <iostream>
using namespace std;

int main() {
    cout << "Asalam o Alikum!" << endl;
    return 0;
}
string np = [SELECT NamespacePrefix FROM Organization].NamespacePrefix;
System.debug(np);
Email was not designed to be used as an alert console. It is not a scalable solution when it comes to monitoring and alert visualisation. A minimal installation of Alerta can be deployed quickly and easily extended as monitoring requirements and confidence grow.
Augmentor is an AI framework for Drupal which allows for the easy integration of disparate AI systems into Drupal.

Augmentor provides a plugable ecosystem for managing a variety of AI services such as GPT3, ChatGPT, NLP Cloud, Google Cloud Vision and many more.
google_cloud_vision_safe_search: Detects explicit content such as adult content or violent content within an image.
google_cloud_vision_labels_detection: Detect labels on an image.
View(active tab)
Version control
21people starred this project

Integrates your Drupal site with CrowdSec to keep suspicious users and cybercriminals away. No account with CrowdSec required, and no other agent software to be installed. This module brings everything required with it. Download with composer, enable the module and rest assured, that a lot of malicious traffic and many attack vectors will just be gone!
Mattermost is an open source platform for secure collaboration across the entire software development lifecycle. This repo is the primary source for core development on the Mattermost platform; it's written in Go and React and runs as a single Linux binary with MySQL or PostgreSQL. A new compiled version is released under an MIT license every month on the 16th.
<template>
    <lightning-combobox
            name="progress"
            label="Status"
            value={value}
            placeholder="Select Progress"
            options={options}
            onchange={handleChange} ></lightning-combobox>

    <p>Selected value is: {value}</p>
</template>

https://developer.salesforce.com/docs/component-library/bundle/lightning-combobox/example
star

Tue May 07 2024 05:58:56 GMT+0000 (Coordinated Universal Time)

@proxylabs

star

Tue May 07 2024 05:34:17 GMT+0000 (Coordinated Universal Time)

@proxylabs

star

Mon May 06 2024 22:04:55 GMT+0000 (Coordinated Universal Time) https://www.thespreadsheetguru.com/loop-open-workbooks-and-modify/

@acassell

star

Mon May 06 2024 21:33:34 GMT+0000 (Coordinated Universal Time) https://www.experts-exchange.com/articles/1457/Automate-Exporting-all-Components-in-an-Excel-Project.html

@acassell

star

Mon May 06 2024 21:31:28 GMT+0000 (Coordinated Universal Time) https://www.devhut.net/vba-fso-files-folders-drives-and-more/

@acassell

star

Mon May 06 2024 21:24:33 GMT+0000 (Coordinated Universal Time) https://learn.microsoft.com/en-us/outlook/troubleshoot/development/vba-macro-that-uses-data-from-word-and-excel-to-send-messages?source

@acassell

star

Mon May 06 2024 21:22:08 GMT+0000 (Coordinated Universal Time) https://learn.microsoft.com/en-us/outlook/troubleshoot/development/vba-macro-that-uses-data-from-word-and-excel-to-send-messages?source

@acassell

star

Mon May 06 2024 21:20:52 GMT+0000 (Coordinated Universal Time) https://wellsr.com/vba/2018/excel/list-files-in-folder-and-subfolders-with-vba-filesystemobject/

@acassell

star

Mon May 06 2024 21:18:48 GMT+0000 (Coordinated Universal Time) https://wellsr.com/vba/2019/excel/list-all-environment-variables-with-vba-environ/

@acassell

star

Mon May 06 2024 21:04:29 GMT+0000 (Coordinated Universal Time) https://chandoo.org/forum/threads/macro-to-extract-text-from-word-doc.43933/

@acassell

star

Mon May 06 2024 20:55:14 GMT+0000 (Coordinated Universal Time) https://chandoo.org/forum/threads/macro-to-extract-text-from-word-doc.43933/

@acassell

star

Mon May 06 2024 20:53:39 GMT+0000 (Coordinated Universal Time) https://learn.microsoft.com/en-us/office/vba/language/reference/user-interface-help/drives-property

@acassell

star

Mon May 06 2024 20:51:19 GMT+0000 (Coordinated Universal Time) https://wellsr.com/vba/2019/excel/vba-udf-to-enhance-excel-cell-and-info-functions/

@acassell

star

Mon May 06 2024 20:49:02 GMT+0000 (Coordinated Universal Time) https://chandoo.org/forum/threads/macro-to-extract-text-from-word-doc.43933/

@acassell

star

Mon May 06 2024 20:26:40 GMT+0000 (Coordinated Universal Time)

@taharjt

star

Mon May 06 2024 18:58:29 GMT+0000 (Coordinated Universal Time) https://www.youtube.com/watch?v=simV5Ga4Xr4

@2late

star

Mon May 06 2024 14:15:53 GMT+0000 (Coordinated Universal Time) https://community.dynamics.com/forums/thread/details/?threadid

@obaidullahjadun

star

Mon May 06 2024 11:26:20 GMT+0000 (Coordinated Universal Time)

@Reemhel #sql

star

Mon May 06 2024 10:20:53 GMT+0000 (Coordinated Universal Time)

@divyasoni23 #css

star

Mon May 06 2024 10:04:14 GMT+0000 (Coordinated Universal Time)

@prakharleet

star

Mon May 06 2024 09:45:31 GMT+0000 (Coordinated Universal Time) https://www.scaler.com/topics/flutter-stripe/

@hey123

star

Mon May 06 2024 09:09:49 GMT+0000 (Coordinated Universal Time) https://expressmagazine.net/development/4009/thuat-toan-ve-tim-kiem-theo-chieu-sau-dfs-bang-ngon-ngu-cc

@haiquydo2311

star

Mon May 06 2024 08:24:47 GMT+0000 (Coordinated Universal Time)

@mastaklance

star

Mon May 06 2024 08:23:41 GMT+0000 (Coordinated Universal Time)

@mastaklance

star

Mon May 06 2024 08:13:33 GMT+0000 (Coordinated Universal Time)

@mebean #php

star

Mon May 06 2024 07:59:08 GMT+0000 (Coordinated Universal Time)

@divyasoni23 #css

star

Mon May 06 2024 07:06:33 GMT+0000 (Coordinated Universal Time)

@signup

star

Sun May 05 2024 21:54:54 GMT+0000 (Coordinated Universal Time)

@Rongrammer1995

star

Sun May 05 2024 19:59:35 GMT+0000 (Coordinated Universal Time) https://medium.com/@ephrahimadedamola/easy-way-to-debug-flutter-apps-wirelessly-with-android-devices-on-mac-27c6711efc35

@lewiseman

star

Sun May 05 2024 15:38:27 GMT+0000 (Coordinated Universal Time)

@iliavial #c#

star

Sun May 05 2024 12:44:33 GMT+0000 (Coordinated Universal Time)

@r0dri #bash

star

Sun May 05 2024 01:50:52 GMT+0000 (Coordinated Universal Time) https://sourcing.alibaba.com/rfq_detail.htm?spm

@sadjxt

star

Sat May 04 2024 22:56:30 GMT+0000 (Coordinated Universal Time) https://codepen.io/dudleystorey/pen/DJqNKP

@skatzy #undefined

star

Sat May 04 2024 22:56:23 GMT+0000 (Coordinated Universal Time) https://codepen.io/dudleystorey/pen/DJqNKP

@skatzy #undefined

star

Sat May 04 2024 20:03:00 GMT+0000 (Coordinated Universal Time)

@khalidbinshamim

star

Sat May 04 2024 19:53:59 GMT+0000 (Coordinated Universal Time)

@saloni_naik

star

Sat May 04 2024 19:42:49 GMT+0000 (Coordinated Universal Time)

@khalidbinshamim

star

Sat May 04 2024 19:35:48 GMT+0000 (Coordinated Universal Time)

@khalidbinshamim

star

Sat May 04 2024 17:45:59 GMT+0000 (Coordinated Universal Time)

@saloni_naik

star

Sat May 04 2024 17:18:40 GMT+0000 (Coordinated Universal Time) https://www.linkedin.com/pulse/how-use-lightning-datatable-web-component-kashish-bansal-tbese/

@saloni_naik

star

Sat May 04 2024 16:49:21 GMT+0000 (Coordinated Universal Time) https://alerta.io/

@al.thedigital

star

Sat May 04 2024 16:18:30 GMT+0000 (Coordinated Universal Time) https://www.drupal.org/project/augmentor

@al.thedigital #explicitcheck #manageaisystems #pluggable

star

Sat May 04 2024 16:15:49 GMT+0000 (Coordinated Universal Time) https://www.drupal.org/project/augmentor_google_cloud_vision

@al.thedigital #imgautocheck #imgtextcheck

star

Sat May 04 2024 16:08:25 GMT+0000 (Coordinated Universal Time) https://www.youtube.com/watch?v

@ahmadou

star

Sat May 04 2024 16:07:37 GMT+0000 (Coordinated Universal Time) https://www.drupal.org/project/crowdsec

@al.thedigital #security #crowd

star

Sat May 04 2024 14:03:26 GMT+0000 (Coordinated Universal Time)

@saloni_naik

Save snippets that work with our extensions

Available in the Chrome Web Store Get Firefox Add-on Get VS Code extension